Collapse a grouped shinyWidgets::pickerInput() drop down list

Hi

I would want to collapse a grouped shinyWidgets::pickerInput() drop-down menu to look something like the first image below which could be expanded to look like the second image ... is this possible?

library(shiny)
  library(shinyWidgets)
  
  ui <- fluidPage(
    pickerInput(
      inputId = "xyz_id",
      label = "Select xyz",
      choices = list(A = c(paste0("A", 1:10)),
                     B = c(paste0("B", 1:10)),
                     C = c(paste0("C", 1:10))),
      multiple = TRUE,
      options = pickerOptions(
        actionsBox = TRUE,
        title = "Please select xyz",
        header = "This is a title"
      )
    )
  )
  
  server <- function(input, output, session) {
    
  }
  
  shinyApp(ui, server)

image
image (1)

Any help would be much appreciated, thanks.

You could try this.

1 Like

Oh wow @nirgrahamuk thank you so so much. :dancer: :dancer: :dancer: :dancer: :dancer:

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.