I use reactiveFileReader
to display a csv file that is updated every 1000-5000 ms. The csv file is located on my computer. The shiny app works well locally but when I deploy it on shinyapps.io the dataset is not updated.
Here is the code below:
library(shiny)
ui <- fluidPage(
fluidRow(
column(12,
tableOutput("dataTable")
)
),
)
server <- function(input, output, session) {
data <- reactiveFileReader(1000, session, "name.csv", read.csv2)
output$dataTable <- renderTable({
data()
})
}
shinyApp(ui = ui, server = server)
Thanks in advance for the help!