我正在尝试在react native中实现signalR, 我的问题是在调试模式打开时运行代码,但是在发行版中并且在调试模式关闭时运行,我有点得到无法与服务器协商的错误...
当我在某些调用中获得console.wanr(err)时,它给了我一些错误,例如 “ {” line“:212081,” column“:33,” sourceURL“:http://10.0.2.2:8081/index.boundle?platform=android&dev=true&minify=false”}“
library(shiny)
library(shinyWidgets)
library(dplyr)
# make a data frame for choices
level1 <- LETTERS[1:3]
level2 <- 1:5
df <- expand.grid(level1, level2, stringsAsFactors = FALSE) %>%
mutate(Var2=paste(Var1, Var2)) %>%
arrange(Var1)
ui <- fluidPage(
mainPanel(
fluidRow(
column(width = 3, "some space"),
column(
width = 9,
align = "center",
radioGroupButtons(
inputId = "level1",
label = "",
status = "success",
size = "lg",
direction = "horizontal",
justified = FALSE,
width = "100%",
individual = TRUE,
checkIcon = setNames(
object = lapply(unique(df$Var1), function(x) icon("check")),
nm = rep("yes", length(unique(df$Var1)))),
choiceNames = unique(df$Var1),
choiceValues = unique(df$Var1)
),
uiOutput("level2"),
tags$hr(),
dataTableOutput("tbl")
)
)
))
server <- function(input, output, session) {
# render the second level of buttons
make_level <- reactive({
df2 <- filter(df, Var1 %in% input$level1)
radioGroupButtons(
inputId = "level2",
label = "",
status = "primary",
size = "lg",
direction = "horizontal",
justified = FALSE,
width = "100%",
individual = TRUE,
checkIcon = setNames(
object = lapply(unique(df2$Var2), function(x) icon("check")),
nm = rep("yes", length(unique(df2$Var2)))),
choiceNames = as.list(unique(df2$Var2)),
choiceValues = as.list(unique(df2$Var2))
)
})
output$level2 <- renderUI({
make_level()
})
output$tbl <- renderDataTable({
df %>% filter(Var1 == req(input$level1), Var2 == req(input$level2))
})
}
shinyApp(ui, server)