Can you help me with the following question: See in ui
, that the daterange
are only shown when a file is loaded via fileInput
- this is working fine in the code. For this, it is necessary to press the Excel
button to show the fileInput
. However, when I choose the database
option, the files are loaded, but the daterange
are not displayed. How can I adjust this?
In case you want to test the Excel
option, here is the file: ex.xlsx - Google Sheets
library(shiny)
library(dplyr)
library(shinythemes)
ui <- fluidPage(
shiny::navbarPage(theme = shinytheme("flatly"), collapsible = TRUE,
br(),
tabPanel("PAGE1",
sidebarLayout(
sidebarPanel(
radioButtons("button",
label = h3("Data source"),
choices = list("Excel" = "Excel",
"Database" = "database"),
selected = "File"),
br(),br(),
uiOutput('fileInput'),
conditionalPanel(
condition = "output.fileUploaded == true",
uiOutput("daterange")
)),
mainPanel(
dataTableOutput('table')
)))))
server <- function(input, output) {
eitherdata <- reactiveVal(NULL)
observeEvent(data(), eitherdata(data()))
observeEvent(data2(), eitherdata(data2()))
output$fileInput <- renderUI({
ib <- req(input$button)
if(ib=="Excel"){
fileInput("file",h4("Import file"), multiple = T, accept = ".xlsx")
} else {
NULL
}
})
observe({
req(input$button)
if (input$button =="database") {
con <- DBI::dbConnect(odbc::odbc(),
Driver = "[your driver's name]",
Server = "[your server's path]",
Database = "[your database's name]",
UID = rstudioapi::askForPassword("Database user"),
PWD = rstudioapi::askForPassword("Database password"),
Port = 1433)
data <-tbl(con, in_schema("dbo", "date1")) %>%
collect()
data2 <- tbl(con, in_schema("dbo", "date2")) %>%
collect()
}
})
output$fileUploaded <- reactive({
return(!is.null(data()))
})
outputOptions(output, 'fileUploaded', suspendWhenHidden=FALSE)
data <- reactive({
if (is.null(input$file)) {
return(NULL)
}
else {
df3 <- read_excel(input$file$datapath,sheetnames()[1])
validate(need(all(c('date1', 'date2') %in% colnames(df3)), "Incorrect file"))
df4 <- df3 %>% mutate_if(~inherits(., what = "POSIXct"), as.Date)
return(df4)
}
})
data2 <- reactive({
req(input$file)
df1 <- read_excel(input$file$datapath,sheetnames()[2])
df1
})
sheetnames <- eventReactive(input$file, {
available_sheets = openxlsx::getSheetNames(input$file$datapath)
})
output$daterange <- renderUI({
req(data())
dateRangeInput("daterange1", "Period you want to see:",
start = min(data()$date2),
end = max(data()$date2))
})
data_subset <- reactive({
req(input$daterange1)
days <- seq(input$daterange1[1], input$daterange1[2], by = 'day')
subset(data(), date2 %in% days)
})
output$table <- renderDataTable({
data_subset()
})
}
shinyApp(ui = ui, server = server)