Skip to content

Instantly share code, notes, and snippets.

@filipstachura
Created July 26, 2017 17:04
Show Gist options
  • Star 1 You must be signed in to star a gist
  • Fork 0 You must be signed in to fork a gist
  • Save filipstachura/9fbf174d5380a512d776139f0045c2ac to your computer and use it in GitHub Desktop.
Save filipstachura/9fbf174d5380a512d776139f0045c2ac to your computer and use it in GitHub Desktop.
library(shiny)
library(shiny.collections)
library(rhandsontable)
library(purrr)
ui = shinyUI(fluidPage(
titlePanel("Handsontable"),
mainPanel(
rHandsontableOutput("hot")
)
))
connection <- shiny.collections::connect()
server = function(input, output) {
# We create collection object, where mydata$collection is reactive value.
mydata <- shiny.collections::collection("mydata", connection)
column_names <- c("a", "b", "c")
isolate({
# If we run the app for the first time, we should fill our DB in
# with some content.
if(is_empty(mydata$collection)) {
shiny.collections::insert(mydata,
list(a = 1, b="a", c = TRUE))
shiny.collections::insert(mydata,
list(a = 3.14, b="xx", c = TRUE))
shiny.collections::insert(mydata,
list(a = 100, b="some text", c = FALSE))
}
})
# Reactive which gives list with changes.
change_list <- reactive({
changes <- NULL
if(!is.null(input$hot$changes$changes)) {
changes <- input$hot$changes$changes %>%
map(function (change) {
# +1 is needed as JS and R indexing differs.
row <- change[[1]] + 1
col <- change[[2]] + 1
new_value <- change[[4]]
list(row = row, col = col, val = new_value)
})
}
changes[[1]]
})
# Here we observe for a change and update mydata using shiny.collections
# insert function.
observe({
if (!is.null(change_list()$val)) {
change_row <- as.list(mydata$collection[change_list()$row, ])
change_col <- names(mydata$collection)[[change_list()$col]]
change_row[[change_col]] <- change_list()$val
shiny.collections::insert(mydata,
change_row,
conflict = "update")
}
})
output$hot <- renderRHandsontable({
rhandsontable(mydata$collection[column_names], useTypes = TRUE) %>%
hot_table(readOnly = FALSE)
})
}
shinyApp(ui = ui, server = server)
@filipstachura
Copy link
Author

An example of synchronized rhandsontable via shiny.collections.

@instantkaffee
Copy link

instantkaffee commented Jul 29, 2017

@filipstachura
Thx a lot for this example, though when I change the column names (in a way that they are not alphabetically sorted (see below), you example throughs an error. Error in bind_rows_: Column a can't be converted from logical to numeric

How to make the example code more robust?

Note I also want to keep the column sequence c, b, a in the handsontable.

library(shiny)
library(shiny.collections)
library(rhandsontable)
library(purrr)

ui = shinyUI(fluidPage(
  titlePanel("Handsontable"),
  mainPanel(
    rHandsontableOutput("hot")
  )
))

connection <- shiny.collections::connect()

server = function(input, output) {
  # We create collection object, where mydata$collection is reactive value.
  mydata <- shiny.collections::collection("mydata", connection)
  column_names <- c("c", "b", "a")

  isolate({
    # If we run the app for the first time, we should fill our DB in
    # with some content.
    if(is_empty(mydata$collection)) {
      shiny.collections::insert(mydata,
                                list(c = 1, b="a", a = TRUE))
      shiny.collections::insert(mydata,
                                list(c = 3.14, b="xx", a = TRUE))
      shiny.collections::insert(mydata,
                                list(c = 100, b="some text", a = FALSE))

    }
  })

  # Reactive which gives list with changes.
  change_list <- reactive({
    changes <- NULL
    if(!is.null(input$hot$changes$changes)) {
      changes <- input$hot$changes$changes %>%
        map(function (change) {
          # +1 is needed as JS and R indexing differs.
          row <- change[[1]] + 1
          col <- change[[2]] + 1
          new_value <- change[[4]]
          list(row = row, col = col, val = new_value)
        })
    }
    changes[[1]]
  })

  # Here we observe for a change and update mydata using shiny.collections
  # insert function.
  observe({
    if (!is.null(change_list()$val)) {
      change_row <- as.list(mydata$collection[change_list()$row, ])
      change_col <- names(mydata$collection)[[change_list()$col]]
      change_row[[change_col]] <- change_list()$val
      shiny.collections::insert(mydata,
                                change_row,
                                conflict = "update")
    }
  })

  output$hot <- renderRHandsontable({
    rhandsontable(mydata$collection[column_names], useTypes = TRUE) %>%
      hot_table(readOnly = FALSE)
  })
}

shinyApp(ui = ui, server = server)

@dokato
Copy link

dokato commented Jul 29, 2017

Elements of collection are returned in alphabetical order. Modifying line 55 to

change_col <- column_names[[change_list()$col]]

can make it more helpful.

Sign up for free to join this conversation on GitHub. Already have an account? Sign in to comment