Is it possible to have a Pop up window emerging from Selectinput Button

I'm trying to get big size pop up windows on the right side coming from disp, cyl and vs buttons from where i can select various values of respective columns.
e.g if i select disp i should be able to get a big popup window where i can see all the values easily and able to select them
Is it possible to do so? Thanks

  library(readr)  
  library(shiny)   
  library(DT)     
  library(dplyr) 
  library(shinythemes) 
  library(htmlwidgets) 
  library(shinyWidgets) 
  
  
  data_table<-mtcars
  
  
  ui = fluidPage( 
  sidebarLayout(
    sidebarPanel (
      
     
      
      selectInput(inputId = "cyl",
                  label = "cyl:",
                  choices = c("All",
                              unique(as.character(data_table$cyl))),
                  selected = "All",
                  multiple = TRUE),
      
      
      
      
      selectInput(inputId = "vs",
                  label = "vs:",
                  choices = c("All",
                              unique(as.character(data_table$vs))),
                  selected = "All",
                  multiple = TRUE),
      
      
      
      selectInput(inputId = "disp",
                  label = "disp:",
                  choices = c("All",
                              unique(as.character(data_table$disp))),
                  selected = "All",
                  multiple = TRUE) ),
    
    
    
    
    mainPanel(width = 12,
      
      
      DT::dataTableOutput('mytable') )))
  
  
  
  
  
  
  
  
  
  server = function(input, output, session) {
  
  
  #tab 1
  thedata <- reactive({
    
  
    if(input$cyl != 'All'){
      data_table<-data_table[data_table$cyl %in% input$cyl,]
    }
    
    
    
    if(input$vs != 'All'){
      data_table<-data_table[data_table$vs %in% input$vs,]
    }
    
    
    if(input$disp != 'All'){
      data_table<-data_table[data_table$disp %in% input$disp,]
    }
    
    data_table
    
    
    
  })
  
  
  
  output$mytable = DT::renderDataTable({
    
    DT::datatable( filter = "top",  rownames = FALSE, escape = FALSE,
                   options = list(pageLength = 50, autowidth=FALSE,
                                  dom = 'Brtip'  ),
                   {     
                     
                     thedata()   # Call reactive thedata()
                     
                     
                   }) 
    
    
  })}  
  
  
  shinyApp(ui = ui, server = server)

...

This topic was automatically closed 21 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.