`accordion(open=TRUE)` is applied to nested accordions
Opened this issue · 2 comments
gadenbuie commented
In the following example, Accordion 2 should be open but the nested accordion within Accordion 2 should have all of its panels closed.
library(shiny)
library(bslib)
ui <- page_fluid(
accordion(
open = "Accordion 2",
accordion_panel("Accordion 1"),
accordion_panel(
"Accordion 2",
accordion(
open = FALSE,
accordion_panel("Nested accordion 1"),
accordion_panel("Nested accordion 2")
)
)
)
)
server <- function(input, output, session) {}
shinyApp(ui, server)
maxl-amberg commented
Unfortunately, I have encountered the exact same issue and would also be very interested in a solution.
jcrodriguez1989 commented
Same needed usecase here, any workaround?