1

I have the simplied Shiny app below who allow to render a unique plot. I want to improve this app by allowing the user to check multiple variables and display the corresponding plots (in a simple presentation, just stacked on top of each other).

I try with for loops in the outputPlot function in the UI and before renderPlot function in the server call but I didn't succeed. Any idea or clue to solve this problem ?

# Library and function
library(ggplot2)
library(shiny)

CountPlotFunction <- function(MyData)
{
  MyPlot <- ggplot(data = MyData, aes(x = MyData)) +
    geom_bar(stat = "count", aes(fill = MyData)) +
    geom_text(stat = "count", aes(label = ..count..)) +
    scale_x_discrete(drop = FALSE) +
    scale_fill_discrete(drop = FALSE)
  return(MyPlot)
}


# The data
var1 <- c("Russia","Canada","Australia","Australia","Russia","Australia","Canada","Germany","Australia","Canada","Canada")
var2 <- c("UnitedStates","France","SouthAfrica","SouthAfrica","UnitedStates","SouthAfrica","France","Norge","SouthAfrica","France","France")
var3 <- c("Brazil","Colombia","China","China","Brazil","China","Colombia","Belgium","China","Colombia","Colombia")
df <- data.frame(var1, var2, var3)


# The Shiny app 
Interface <- 
{
  fluidPage(
    sidebarPanel(
      checkboxGroupInput(inputId = "Question",
                         label = "Choose the question",
                         choices = colnames(df),
                         selected = colnames(df)[1])),
      mainPanel(plotOutput(outputId = "ThePlot")))
}

Serveur <- function(input, output)
{
  output$ThePlot <- renderPlot({CountPlotFunction(MyData = df[input$Question])})
}

shinyApp(ui = Interface, server = Serveur)
Kumpelka
  • 869
  • 3
  • 11
  • 33

1 Answers1

1

There are several ways to to do what you want. In shiny you can use renderUI. See code below.

library(ggplot2)
library(shiny)

CountPlotFunction <- function(MyData)
{
  MyPlot <- ggplot(data = MyData, aes(x = MyData)) +
    geom_bar(stat = "count", aes(fill = MyData)) +
    geom_text(stat = "count", aes(label = ..count..)) +
    scale_x_discrete(drop = FALSE) +
    scale_fill_discrete(drop = FALSE)
  return(MyPlot)
}


# The data
var1 <- c("Russia","Canada","Australia","Australia","Russia","Australia","Canada","Germany","Australia","Canada","Canada")
var2 <- c("UnitedStates","France","SouthAfrica","SouthAfrica","UnitedStates","SouthAfrica","France","Norge","SouthAfrica","France","France")
var3 <- c("Brazil","Colombia","China","China","Brazil","China","Colombia","Belgium","China","Colombia","Colombia")
df <- data.frame(var1, var2, var3)


# The Shiny app 
Interface <- 
{
  fluidPage(
    sidebarPanel(
      checkboxGroupInput(inputId = "Question",
                         label = "Choose the question",
                         choices = colnames(df),
                         selected = colnames(df)[1])),
    mainPanel(
      uiOutput('ui_plot') 
    )
  )
}

Serveur <- function(input, output)
{
  # gen plot containers
  output$ui_plot <- renderUI({ 
    out <- list()
    if (length(input$Question)==0){return(NULL)}
    for (i in 1:length(input$Question)){
      out[[i]] <-  plotOutput(outputId = paste0("plot",i))
    }  
    return(out) 
  })

  # render plots
  observe({  
    for (i in 1:3){  
      local({  #because expressions are evaluated at app init
        ii <- i 
        output[[paste0('plot',ii)]] <- renderPlot({ 
          if ( length(input$Question) > ii-1 ){  
            return(CountPlotFunction(MyData = df[input$Question[[ii]]]))
          } 
          NULL
        })
      })
    }                                  

  })

}

shinyApp(ui = Interface, server = Serveur)
Eduardo Bergel
  • 2,685
  • 1
  • 16
  • 21