You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
This is related to #896. I wanted to have no initial dateInput() value AND set a min value. I have other dynamic UI elements in my code. When I set min with value = as.Date(NA), it breaks server side rendered UI elements. Below is a MWE:
library(shiny)
ui <- fluidPage(
titlePanel("Test DateInput Bug"),
sidebarLayout(
sidebarPanel(
dateInput("date", "Date Input", value = as.Date(NA),
# This breaks all server side UI output for some reason...
min = Sys.Date(),
daysofweekdisabled = c(0, 6)),
radioButtons("test", "Show Text Input", choices = c("No", "Yes"), selected = "No"),
uiOutput("testText")
),
mainPanel()
)
)
server <- function(input, output) {
output$testText <- renderUI ({
if (input$test == "Yes") {
textInput("test", "Testing if this is effected by dateInput() min and max parameters", "")
}
})
}
shinyApp(ui = ui, server = server)
The text was updated successfully, but these errors were encountered:
This is related to #896. I wanted to have no initial dateInput() value AND set a min value. I have other dynamic UI elements in my code. When I set min with
value = as.Date(NA)
, it breaks server side rendered UI elements. Below is a MWE:The text was updated successfully, but these errors were encountered: