Embedding a selectInput (multiInput) in a modalDialog

I have added a actionButton to my sidebar:

sidebar <- dashboardSidebar(
  sidebarMenu(id = "tabs", 
              sidebarMenuOutput("menu")),
  actionButton(inputId = "Filter", label = "Filter", icon = NULL)
)

And in server.R iI have the following lines:

  filterModal <- function() {
    modalDialog(
      span('Selecteer de gewenste dienst(en)'),
#      multiInput(inputId = plotDienst, label = "PlotDienst", choices = Diensten),
    footer = tagList(modalButton("Annuleer"),
                     actionButton("ok", "Pas toe"))
    )
  }

  observeEvent(input$Filter, {
    showModal(filterModal())
  })
  observeEvent(input$ok, {
    showModal(filterModal())
  })

This code dispays a modalDialog with a functional Cancel and actionButton.
When I uncomment the multiInput-line, Shiny aborts without showing an error.

My question is if it is possible to build a modalDialog with an embedded multiSelect?

Ben

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.