核取方塊組
建立一組核取方塊,可用於獨立切換多個選項。伺服器將接收輸入作為所選值的字元向量。
library(shiny)
ui <- fluidPage(
checkboxGroupInput("checkGroup1", label = h3("This is a Checkbox group"),
choices = list("1" = 1, "2" = 2, "3" = 3),
selected = 1),
fluidRow(column(3, verbatimTextOutput("text_choice")))
)
server <- function(input, output){
output$text_choice <- renderPrint({
return(paste0("You have chosen the choice ",input$checkGroup1))})
}
shinyApp(ui = ui, server = server)
可以更改設定:
- 標籤:標題
- 選擇:選定的值
- selected:最初選擇的值(NULL 表示沒有選擇)
- 內聯:水平或垂直
- 寬度
也可以新增 HTML。