如何重置依赖于输入计算的输出?

问题描述 投票:0回答:1

我真的很难找到这个问题的标题,希望它有帮助。

我有一个相当复杂的应用程序,在

actionButton
(本例中为“确认”)触发重新评估为反应表提供数据的
reactiveValues
数字后,我无法重置输出。

这会导致

selected
表仅渲染一次,并且无论为其提供数据的表更改了多少次,它都会始终显示与第一次渲染时相同的结果。

从这个例子中你会很容易明白我的意思。相信我,这是我来自的那个极小极大:

library(shiny)
library(DT)
 

ui <- fluidPage(
  DTOutput("table"),
  actionButton("checkvalues", "Check")
  
)

server <- function(input, output, session) {
  
  primedata <- reactiveValues(data = NULL)
  primedata$data <- as.numeric(Sys.time()) %% 10000 
  
  tabledata <- reactive({
    
    data <- data.frame(rep(primedata$data, 5))
    for (i in 1:5) {
      data$V1[i] <- as.character(selectInput(paste0("sel", i), "",
                                             choices = c("None selected" = 0,
                                                          "Icecream", "Donut"), 
                                                          selected = 0, width = "120px"))
  }
    return(data)
    })
  
  
  output$table <- renderDataTable( #Generar tabla
    
    tabledata(), filter = 'top', escape = FALSE, selection = 'none', server = FALSE,
    callback = JS("table.rows().every(function(i, tab, row) {
            var $this = $(this.node());
            $this.attr('id', this.data()[0]);
            $this.addClass('shiny-input-container');
          });
          Shiny.unbindAll(table.table().node());
          Shiny.bindAll(table.table().node());")
    
  )
  
  # helper function for reading inputs in DT
  shinyValue = function(id, len) { 
    unlist(lapply(seq_len(len), function(i) { 
      value = input[[paste0(id, i)]] 
      if (is.null(value)) NA else value 
    })) 
  }
  
  observeEvent(input$checkvalues, {
    
    datos <- tabledata()
    
      selected <- cbind(datos, data.frame(N = shinyValue("sel", nrow(datos)))) 
      selected <- selected %>% group_by(N) %>% summarise("see" = n())
    showModal(modalDialog(
      title = HTML('<h3 style="text-align:center;">Problem: this table will keep showing the same results as the first one presented</h3>'),
      renderDT(datatable(selected, options = list(dom = 't', ordering = F))),
      footer = actionButton("Confirm", "Confirm")))
    
  })
  
  observeEvent(input$Confirm, {
    
     primedata$data <- as.numeric(Sys.time()) %% 10000
      
     removeModal() 

    })
  
}

shinyApp(ui, server)
r shiny dt shiny-reactivity
1个回答
2
投票

当您更改

primedata$data
(通过单击“确认”按钮)时,这将重新呈现表格,并且您必须在此之前取消绑定:

ui <- fluidPage(
  tags$head(tags$script(
    HTML(
      "Shiny.addCustomMessageHandler('unbindDT', function(id) {
        var $table = $('#'+id).find('table');
        if($table.length > 0){
          Shiny.unbindAll($table.DataTable().table().node());
        }
      })")
  )),
  DTOutput("table"),
  actionButton("checkvalues", "Check")
)


  observeEvent(input$Confirm, {
    
    session$sendCustomMessage("unbindDT", "table")
    
    primedata$data <- as.numeric(Sys.time()) %% 10000
    
    removeModal() 
    
  })
© www.soinside.com 2019 - 2024. All rights reserved.