updateCheckboxInput(session, inputId, label = NULL, value = NULL)
session
object passed to function given to
shinyServer
.numericInput()
and
updateNumericInput()
take a similar set of arguments. Any arguments with NULL values will be ignored; they will not result in any
changes to the input object on the client. For radioButtons()
, checkboxGroupInput()
and
selectInput()
, the set of choices can be cleared by using
choices=character(0)
. Similarly, for these inputs, the selected item
can be cleared by using selected=character(0)
.checkboxInput
## Only run examples in interactive R sessions
if (interactive()) {
ui <- fluidPage(
sliderInput("controller", "Controller", 0, 1, 0, step = 1),
checkboxInput("inCheckbox", "Input checkbox")
)
server <- function(input, output, session) {
observe({
# TRUE if input$controller is odd, FALSE if even.
x_even <- input$controller %% 2 == 1
updateCheckboxInput(session, "inCheckbox", value = x_even)
})
}
shinyApp(ui, server)
}
Run the code above in your browser using DataLab