rstudio / bslib

Tools for theming Shiny and R Markdown via Bootstrap 3, 4, or 5.
https://rstudio.github.io/bslib/
Other
487 stars 57 forks source link

Fillable Hidden Tabset Panel #966

Open TymekDev opened 10 months ago

TymekDev commented 10 months ago

Hi, I am just trying out a fillable layouts and noticed that there is no support for fillability within navset_hidden. I see that it is based on tabsetPanel as opposed to navset_bar that supports fillability and uses an internal function.

I looked at the source code and noticed an unexported makeTabsFillable function. With it I was able to make myself a fillable hidden tabset panel:

fillable_hidden_tabset_panel <- function(..., id) {
  panel <- shiny::tabsetPanel(id = id, type = "hidden", ...)
  panel$children[[2]] <- bslib:::makeTabsFillable(panel$children[[2]])
  bslib::as_fill_carrier(panel)
}

Do you think this is something that {bslib} could support out of the box?

rmvegasm commented 3 months ago

Just struggling with the exact same issue over here. Would be great if this was supported out of the box!