繁体   English   中英

如何在字符串中使用 Shiny 输入作为反应函数并作为观察事件的条件

[英]How to use Shiny inputs in a string for reactive function and as a condition for observe event

我正在尝试在反应元素或观察事件中使用自动生成的 selectInput ID。 当我明确编写输入 ID 时,例如input$dfSelect1,input$dfSelect2,input$dfSelect3 ,它会按我的input$dfSelect1,input$dfSelect2,input$dfSelect3工作。

由于我事先不知道会有多少个 ID(数据将是用户输入),我需要创建与自动相同的输入 ID 字符串,但它不会将其识别为观察事件或输入数据中的触发器在反应元素中。

这是我的问题的最小可重现示例。 如果您注释掉第 1 行req(input$dfSelect1,input$dfSelect2,input$dfSelect3)和第 2 行dfx <- data.frame(carb = c(input$dfSelect1,input$dfSelect2,input$dfSelect3),stringsAsFactors = F)并从以下行中删除注释,这将是我正在尝试做的情况。

知道如何传递这些值吗?

library(dplyr)
library(DT)

exdata <- head(mtcars, 3) 
exdata$ROWs <- row.names(exdata)

ui <- fluidPage(
  headerPanel("Example"),
  mainPanel(
    uiOutput("selectionUI"),
    uiOutput("tableOutput")
  )
)

server <- function(input, output, server) {

  ### reqString result <- input$dfSelect1,input$dfSelect2,input$dfSelect3
  reqString <- noquote(paste0(unlist(lapply(1:length(sort(unique(row.names(exdata)))),function(i) {paste0("input$dfSelect",i,"")})),collapse = ","))

  values <- reactiveValues(
    upload_state = NULL
  )

  observe({
    ### 1-USE the line below with reqString instead -doesn't work ##
    req(input$dfSelect1,input$dfSelect2,input$dfSelect3)
    # req(reqString)
    values$upload_state <- 'uploaded'
  })

  output$selectionUI <- renderUI({
    df <- sort(unique(row.names(exdata)))
    wellPanel(
      lapply(1:length(df), function(i) {selectizeInput(paste0("dfSelect",i,""),df[i],choices=c("", unique(exdata$carb)))})
    )
  })

  completeTable <- reactive({
    browser()
    if (is.null(values$upload_state)) {
      return(exdata)
    }else if (values$upload_state == 'uploaded') {
      ### 2-USE the line below with  reqString instead -doesn't work##
      dfx <- data.frame(carb = c(input$dfSelect1,input$dfSelect2,input$dfSelect3),stringsAsFactors = F)
      # dfx <- data.frame(carb = c(reqString),stringsAsFactors = F)
      dfx <- data.frame(carb =as.numeric(unlist(dfx)))
      dataJoin <- exdata %>% left_join(dfx,by=("carb"))
    }
  })

  output$tableOutput <- renderUI({
    DT::dataTableOutput("dataTableServer")
  })

  output$dataTableServer <- DT::renderDataTable({
    DT::datatable(completeTable())
  })

}

shinyApp(ui = ui, server = server)

您可以使用[[而不是$索引input

sapply(1:length(sort(unique(row.names(exdata)))), 
       FUN=function(x) req(input[[paste0("dfSelect", x)]]))

l <- sapply(1:length(sort(unique(row.names(exdata)))), 
            FUN=function(x) input[[paste0("dfSelect", x)]])
dfx <- data.frame(carb = l,stringsAsFactors = F)

暂无
暂无

声明:本站的技术帖子网页,遵循CC BY-SA 4.0协议,如果您需要转载,请注明本站网址或者原文地址。任何问题请咨询:yoyou2525@163.com.

 
粤ICP备18138465号  © 2020-2024 STACKOOM.COM