Does anyone have a good solution for putting the checkboxInput into the navbarPage in such a way that it is clickable in the navbar? The sample below is sorta what I want, but the code fails with the checkbox in navbar
library(shiny)
library(bslib)
ui <- fluidPage(
navbarPage(
theme = bs_theme(bootswatch = "flatly"),
title = 'Methods',
tabPanel('One'),
tabPanel('Two'),
tabPanel('Three'),
tabPanel('Four'),
checkboxInput('aCheckBox', 'Check Me', TRUE)
),
mainPanel(
h1('Hello World'),
fileInput("file", "Choose CSV File", accept = ".csv"),
actionButton('aButton', 'Do Stuff'),
submitButton("Submit"),
actionButton("primary", "Primary", class = "btn-primary m-2"),
#checkboxInput('aCheckBox', 'Check Me', TRUE)
)
)
server <- function(input, output) {
}
shinyApp(ui = ui, server = server)