selectInput within navs_tab_card: options cut off

Hello,

When including selectInput in a navs_tab_card, the open selectbox doesn't show all of its options:
Screenshot 2023-04-02 23.17.58

Here is the minimal reprex:

library(shiny) 
library(bslib) 
library(shinyWidgets)   

ui <- bslib::page_navbar(
  title = "MyApp",
  selected = "Orders",
  tabPanel(
    title = "Orders", 
    bslib::navs_tab_card(
      nav(
        "criteria", 
        selectInput(
          inputId = "year",
          selectize = TRUE,
          label = NULL,
          choices = 1:10
        )
      )
    ),
    tags$p("wdwd ggerg gdf gdg d fgdgdgdfgdfg dfg wdwd ggerg 
           gdf gdg d fgdgdgdfgdfg dfg wdwd ggerg gdf gdg d 
           fgdgdgdfgdfg dfg wdwd ggerg gdf gdg d fgdgdgdfgdfg dfg ")
  )
)
server <- function(input, output) { }
shinyApp(ui, server)

Is this a bug? If not, how can I solve this?

Edit: Similar problems were previously solved via adding style= "overflow:visible;" . but that isn't possible here as bslib::navs_tab_card doesn't take "style" as parameter.

Referred here by rstudio/bslib

This topic was automatically closed 54 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.