Checkbox Input Control
Create a checkbox that can be used to specify logical values.
checkboxInput(inputId, label, value = FALSE, width = NULL)
inputId
: The input
slot that will be used to access the value.label
: Display label for the control, or NULL
for no label.value
: Initial value (TRUE
or FALSE
).width
: The width of the input, e.g. '400px'
, or '100%'
; see validateCssUnit()
.A checkbox control that can be added to a UI definition.
TRUE
if checked, FALSE
otherwise.
## Only run examples in interactive R sessions if (interactive()) { ui <- fluidPage( checkboxInput("somevalue", "Some value", FALSE), verbatimTextOutput("value") ) server <- function(input, output) { output$value <- renderText({ input$somevalue }) } shinyApp(ui, server) }
checkboxGroupInput()
, updateCheckboxInput()
Other input elements: actionButton()
, checkboxGroupInput()
, dateInput()
, dateRangeInput()
, fileInput()
, numericInput()
, passwordInput()
, radioButtons()
, selectInput()
, sliderInput()
, submitButton()
, textAreaInput()
, textInput()
, varSelectInput()
Useful links