html R选定的亮显输入在renderDataTable单元格内

m528fe3b  于 2022-12-16  发布在  其他
关注(0)|答案(3)|浏览(125)

我搜索将selectedInputs放入renderDataTable单元格的解决方案。我找到了js解决方案:https://datatables.net/examples/api/form.html,但是我不知道如何在shinyjs中实现这个解决方案作为renderDataTable对象。我将非常感谢如何在shiny中实现可编辑的renderDataTable的提示/想法/解决方案。

ecfsfe2w

ecfsfe2w1#

与此非常相似:添加包含TRUE/FALSE的列并将其显示为复选框

library(shiny)
library(DT) 
runApp(list(
  ui = basicPage(
    h2('The mtcars data'),
    DT::dataTableOutput('mytable'),
    h2("Selected"),
    tableOutput("checked")
  ),

  server = function(input, output) {
    # helper function for making checkbox
    shinyInput = function(FUN, len, id, ...) { 
      inputs = character(len) 
      for (i in seq_len(len)) { 
        inputs[i] = as.character(FUN(paste0(id, i), label = NULL, ...)) 
      } 
      inputs 
    } 
    # datatable with checkbox
    output$mytable = DT::renderDataTable({
      data.frame(mtcars,Rating=shinyInput(selectInput,nrow(mtcars),"selecter_",
                                            choices=1:5, width="60px"))
    }, selection='none',server = FALSE, escape = FALSE, options = list( 
      paging=TRUE,
      preDrawCallback = JS('function() { 
Shiny.unbindAll(this.api().table().node()); }'), 
      drawCallback = JS('function() { 
Shiny.bindAll(this.api().table().node()); } ') 
    ) )
    # helper function for reading checkbox
    shinyValue = function(id, len) { 
      unlist(lapply(seq_len(len), function(i) { 
        value = input[[paste0(id, i)]] 
        if (is.null(value)) NA else value 
      })) 
    } 
    # output read checkboxes
    output$checked <- renderTable({
      data.frame(selected=shinyValue("selecter_",nrow(mtcars)))
    })
  }
))

注意,如果重新呈现表,输入将不起作用,除非添加一些额外的代码来解除绑定。
编辑:
假设表中的数据是被动的,所以它发生了变化,表重新呈现,你需要显式地按照@yihui来解除绑定:https://groups.google.com/forum/#!msg/shiny-discuss/ZUMBGGl1sss/zfcG9c6MBAAJ
因此,您需要在UI中添加:

tags$script(HTML("Shiny.addCustomMessageHandler('unbind-DT', function(id) {
          Shiny.unbindAll($('#'+id).find('table').DataTable().table().node());
        })"))

然后,在服务器中,每当使用以下命令重新呈现数据表时,您都会触发该函数:

session$sendCustomMessage('unbind-DT', 'mytable')

colnames参数是一个列名称的向量,所以当你指定一个长度为FALSE的向量时,它会给你一个表,其中有一个列的名称为FALSE。我不确定从数据表中删除列名称的直接方法。这本身就是一个很好的SO问题。

8fq7wneg

8fq7wneg2#

为什么不使用DT的标准功能(Shiny.bindAll)
示例(在控制台打印选择第1行)

library(shiny)
library(DT)
mymtcars = mtcars
mymtcars$id = 1:nrow(mtcars)
runApp(
  list(ui = fluidPage(

      DT::dataTableOutput("mytable")
    )

  , server = function(input, output, session) {

    observe({
      print(input$row1)
    })

    output$mytable = DT::renderDataTable({
      #Display table with select
      DT::datatable(cbind(Pick=paste0('
                                      <select id="row', mymtcars$id, '"> <option>1</option>
                                      <option>2</option></select>',""), mymtcars),
                    options = list(orderClasses = TRUE,
                                   lengthMenu = c(5, 25, 50),
                                   pageLength = 25 ,

                                   drawCallback= JS(
                                     'function(settings) {
                                     Shiny.bindAll(this.api().table().node());}')
                                   ),selection='none',escape=F)

    } )

  })
)
kgqe7b3p

kgqe7b3p3#

我在这里提供了一个解决方案:https://stackoverflow.com/a/74784940/16038025。或者,下面是一个简单的解决方案:

buildOptionalDropdowns <- function(id, choices, selected){
  if(length(choices) > 1)
    return(selectInput(inputId = id, label = NULL, choices = choices, selected = selected))
  else
    return(choices)
  } 

res <- data.frame(a = c(rep(0,5), rep(1,5)),
                  b = character(10)) # adds an empty column
for (i in seq_along(res)) {
   res$b[i] <- as.character(buildOptionalDropdowns(paste0("row_select_", i), 
                                                   choices,
                                                   res$b[[i]]))
}
resultTable <- DT::datatable(res,
                             escape = FALSE)

即使这个问题是几年前提出的,它可能仍然有助于一些人。

相关问题