i have a checkbox group in my shiny dashboard body
checkboxGroupInput("dbr", selected = NULL,
h4("Select a box"),
c(
"Low" = "Low",
"Medium" = "Medium",
"High" = "High",
"Critical" = "Critical"
# End check list
),
# End check group
),
i also have an action button that I'm using as a reset button for checkbox items on the page
actionButton("reset_artifact_entry", label = "Reset")
in the server section of the code i have a call for reset
server <- function(input, output, session)
# Rest button for artifact entry page
observeEvent(input$reset_artifact_entry, {
updateCheckboxGroupInput(session, "dbr", selected = NULL)
})
i don't get any errors when the code runs, but nothing happens when i click the button either -
I've looked all over stackoverflow and wherever i could to find the solution to this...
I'm sure its in the way i have it set up but i can't seem to find where
cheers ~!