bslib icon indicating copy to clipboard operation
bslib copied to clipboard

Fillable Hidden Tabset Panel

Open TymekDev opened this issue 2 years ago • 1 comments

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?

TymekDev avatar Jan 12 '24 10:01 TymekDev

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

rmvegasm avatar Jul 23 '24 16:07 rmvegasm