Could anyone suggest me the way to extract shiny checkboxgroupoinput options of different ggplots such as geom_bar(), geom_line() as a list. I tried the following simplified code, it prints only the last plot: Thanks for your help.
 library(shiny)
  library(ggplot2)
  library(easyGgplot2)
  patient <- cbind.data.frame(seq(1:14),matrix(sample(1:100, 84), ncol=6))
 colnames(patient) <- c('DAYS', 'PHYSICAL_ACTIVITY', 'SMOKING','ALCOHOL_INTAKE', 'HYDRATION', 'SLEEP', 'Total_score')
    ui <- fluidPage(
                titlePanel("Data Plot"),
                        sidebarLayout(
                                sidebarPanel(
                        fluidRow(column(6, 
                                    checkboxGroupInput("checkGroup", 
                                      ("Parameters"), 
                                    list("PHYSICAL ACTIVITY" = 1, 
                                       "SLEEP" = 2, 
                                      "ALCOHOL INTAKE" = 3,
                                      "SELECT ALL" = 4
                                        )))
                                      ),
                       fluidRow(column(10, actionButton("goButton", label = "Analysis Report"))
                                            )
                                          ), #Sidebarpanel
                                                    mainPanel(
                                                        plotOutput("plot1", height='800px')
                                        )#Mainpanel
                      ) #Sidebar layout
        )#fluidpage
 server <- function(input, output) {
 output$plot1 <- renderPlot({ 
 input$goButton
  p1 <- reactive({
    if(!(1 %in% input$checkGroup)) return(NULL)
      ggplot(data=patient, aes(x=DAYS, y=PHYSICAL_ACTIVITY))+geom_bar(stat="identity", aes(fill=PHYSICAL_ACTIVITY<=median(PHYSICAL_ACTIVITY)), show.legend=F)+scale_fill_manual(values = c('steelblue', 'red') )+labs(title = 'PHYSICAL ACTIVITY (STEPS)', x = NULL, y = NULL)+theme_minimal()
   })
  # Second plot
  p2 <- reactive ({
      if(!(2 %in% input$checkGroup )) return(NULL)
      p2 <- ggplot(data=patient, aes(x=DAYS,y=SLEEP))+geom_line(colour='black', size=1)+geom_point(size=3, aes(colour=cut(SLEEP,c(-Inf,summary(SLEEP)[[2]],summary(SLEEP)[[5]],Inf))), show.legend=F)+scale_color_manual(values = c("red", "orange","green"))+labs(title = 'SLEEP (hrs)', x = NULL, y = NULL) +theme_minimal() 
  })
  ptlist <- list(p1(),p2())
  ggplot2.multiplot(ptlist, cols=1)
 })
 }
shinyApp(ui, server)
 
     
    