在 Shiny 中使用 InsertUI 时如何获得正确的 InputID

How to get the correct InputID while using InsertUI in Shiny

我对 InsertUI 和元素的相应 InputID 有疑问。

在下面的示例中,selectizeInput "Number_Product1_1" 的 inputID 显示了 1. Division 在 boxOutput "InputID" 中的输出。

如果此 InputID 用作 boxOutput "Total" 的输入,则不会显示任何输出。

如果添加了更多的Division,则第1个division的Product1的数量(在下面的示例中为'50')是以下division的boxOutput "Total"中的输出。但是为什么 1. 分区没有显示此输出?

我很困惑。有人可以向我解释为什么会发生这种转变吗?

感谢您的意见!

library(shiny)
library(shinydashboard)

# Define UI
ui <- fluidPage(
titlePanel("Identify Total amount/Divison"),
sidebarLayout(
sidebarPanel(
  width = 12,
  # Buttons to add/remove a question
  actionButton("add", "Add Divison"),
  actionButton("remove", "Remove Divison"),
  div(id = "questions",
      style = "border: 1px solid silver;")
),
mainPanel(
)))



# Define server logic 
server <- function(input, output) {
values <- reactiveValues(num_questions = 0) 
# Add a division
observeEvent(input$add, ignoreNULL = FALSE, {

values$num_questions <- values$num_questions + 1
num <- values$num_questions
ui = tags$div(
  insertUI(
    selector = "#questions", where = "beforeEnd",
    splitLayout(
      cellWidths = c("20%","20%", "20%", "20%", "20%"), 
      cellArgs = list(style = "padding: 3px"),
      id = paste0("question", num),
      textAreaInput(inputId = paste0("Division_", num),
                    label = paste0(num, ". Division:"),
                    placeholder = "Placeholder"),

      selectizeInput(inputId =paste0("Number_Product1_", num),
                         label = paste0("Product1"), isolate(seq(from = 50, to = 100000, by = 50)), multiple=FALSE),
      selectizeInput(inputId =paste0("Number_Product2_", num),
                     label = paste0("Product2"), isolate(seq(from = 0, to = 100000, by = 50)), multiple=FALSE),
      box(
        title = "Total", width = 12, background = "black",


        input$Number_Product1_1),   #### Input from selectizeInput "Product 1" 



       box(
        title = "inputID", width = 12, background = "black",

        paste0("Number_Product1_", num))  #### inputID's of the selectizeinput "Product 1"
      )))

})

# Remove a division
observeEvent(input$remove, {
num <- values$num_questions
# Don't let the user remove the very first Row
if (num == 1) {
  return()
}
removeUI(selector = paste0("#question", num))
values$num_questions <- values$num_questions - 1
})

}


# Run the application 
shinyApp(ui = ui, server = server)

我可能需要想出更好的解释,同时错误已修复。

我的理解是,在 insertUI 中,您试图访问一个 id,其值仅在 insertUI 之后创建,因此我尝试单独呈现它并将其输出分配给 box值。

library(shiny)
library(shinydashboard)

# Define UI
ui <- fluidPage(
  titlePanel("Identify Total amount/Divison"),
  sidebarLayout(
    sidebarPanel(
      width = 12,
      # Buttons to add/remove a question
      actionButton("add", "Add Divison"),
      actionButton("remove", "Remove Divison"),
      div(id = "questions",
          style = "border: 1px solid silver;")
    ),
    mainPanel(
    )))



# Define server logic 
server <- function(input, output) {
  values <- reactiveValues(num_questions = 0) 
  # Add a division
  observeEvent(input$add, ignoreNULL = FALSE, ignoreInit = TRUE,{

    values$num_questions <- values$num_questions + 1
    num <- values$num_questions
    #ui = tags$div(
   # observe({


      insertUI( immediate = TRUE,
        selector = "#questions", where = "beforeEnd",

        splitLayout(
          cellWidths = c("20%","20%", "20%", "20%", "20%"), 
          cellArgs = list(style = "padding: 3px"),
          id = paste0("question", num),
          textAreaInput(inputId = paste0("Division_", num),
                        label = paste0(num, ". Division:"),
                        placeholder = "Placeholder"),

          selectizeInput(inputId =paste0("Number_Product1_", num),
                         label = paste0("Product1"), isolate(seq(from = 50, to = 100000, by = 50)), multiple=FALSE,
                         selected = 50),
          selectizeInput(inputId =paste0("Number_Product2_", num),
                         label = paste0("Product2"), isolate(seq(from = 0, to = 100000, by = 50)), multiple=FALSE),



          box(
            title = "Total", width = 12, background = "black",

            print( input$Number_Product1_1),

            textOutput("total")

          ),   #### Input from selectizeInput "Product 1" 



          box(
            title = "inputID", width = 12, background = "black",

            paste0("Number_Product1_", num))  #### inputID's of the selectizeinput "Product 1"
        ))
      #)
   # })
  })

  #observe({

   # require(input$Number_Product1_1)
    output$total <- renderText({
      input[["Number_Product1_1"]] 
    })
 # })

  # Remove a division
  observeEvent(input$remove, {
    num <- values$num_questions
    # Don't let the user remove the very first Row
    if (num == 1) {
      return()
    }
    removeUI(selector = paste0("#question", num))
    values$num_questions <- values$num_questions - 1
  })

}


# Run the application 
shinyApp(ui = ui, server = server)

图片: