0

协助将不胜感激。

我正在开发一个闪亮的应用程序,它涉及使用多个 SQlite 数据库和 rhandsontable 包。我在网上找到了很多关于使用这个包的有用材料,但我很沮丧,因为我花了 2 天时间解决一个我认为值得一问的问题。

所以下面的脚本描述了 rhandsontable 的服务器和 UI。我希望能够启用用户编辑,并保护他们修改过的表(网上有很多内容)但跨多个表(我正在努力解决的问题)

我的代码所做的是它打开了第一个表,是的,如果我进行修改,它确实是安全的。但是当我尝试通过选择输入转到另一个表时,另一个表的内容会立即被最初修改的内容替换。

我真的希望修改独立而不影响其他表。

再次,我们将不胜感激。

downloadTableUI <-  function(id) {
  ns <- NS(id)
  tagList(
    sidebarLayout(
      sidebarPanel( 
        selectInput(ns("dataset"), "Choose a dataset:",
          choices = dput(as.character(alltables[1: NROW(alltables)]))),
        radioButtons(ns("filetype"), "File type:",
          choices = c("csv", "tsv")),
        dateRangeInput(ns("daterange2"), "Date Filtration",
          start = "2017-02-17",
          end = "2017-03-07"),
        actionButton(ns("saveBtn"), "Save"),
        br(),
        downloadButton(ns('downloadData'), 'Download File', class = "btn-info")
      ),
      mainPanel(
        rHandsontableOutput(ns('tabletest'), width = 730, height = 600)
      ),
      position = c("left")
    )
  )
}

DownloadTable <-  function(input, output, session, pool) {
#select databases
  tableChoozer <- reactive({input$dataset})
  # dateSelector <- reactive({input$daterange2})

  # Initiate the reactive table
  p1 <- reactive({
    results <- dbGetQuery(pool, paste('select * from ', tableChoozer()))
    return (results) 
  })

  Mychanges <- reactive({

    observe({
    input$saveBtn# update database file each time the button is pressed
    if (!is.null(input$tabletest)) {#if there 's a table input
      dbWriteTable(pool, tableChoozer(),hot_to_r(input$tabletest), overwrite = TRUE, row.names = FALSE)# overwrite the database
    }
  })
#THIS IS WHERE I THINK THE PROBLEM IS
    if (is.null(input$tabletest)) {
      return (p1())
    } else if (!identical(p1(), input$tabletest)) {
      mytable <- as.data.frame(hot_to_r(input$tabletest))
      return (mytable)
    }
  })


output$tabletest <- renderRHandsontable({
    rhandsontable(Mychanges()) %>%
    hot_cols(columnSorting = TRUE, highlightCol = TRUE, highlightRow = TRUE,allowRowEdit = FALSE, allowColEdit = FALSE, exportToCsv = TRUE)
  })


  output$downloadData <- downloadHandler(
    filename = function() {
      paste("table.csv")
    },
    content = function(file) {
      sep <- switch (input$filetype, "csv" = ",", "tsv" = "\t")

      write.table(p1(), file, sep = sep, row.names = FALSE)
    }
  )
}
4

1 回答 1

1

此代码未经测试,但希望它可以工作。server.R将以下内容放在文件的顶层

observeEvent( input$saveBtn, 
  {
    # update database file each time the button is pressed
    if (!is.null(input$tabletest)) {
      #if there 's a table input
      dbWriteTable(pool, tableChoozer(),
        hot_to_r(input$tabletest), overwrite = TRUE, row.names = FALSE)
        # overwrite the database
   },
   ignoreInit = TRUE
)

使用observeEvent而不是防止对和这似乎是你的问题observe的反应性依赖。使它在保存按钮的初始化时不会触发保存事件。tableChoozerinput$tabletestignoreInit

于 2017-09-16T14:27:05.043 回答