Jackie
Jackie

Reputation: 1

Problem with reactive bar plot in Shiny App

I'm trying to generate a shiny app that reactively creates this bar chart. It is a bar graph that shows the number of people vaccinated on the vertical axis and the area, such as New York or Boston, on the horizontal axis.

I include the complete code, I don't know why if I put in the hchart: y = df [, 2] it works, but if I put y = df [, colm] it doesn't. Any suggestion?


# Libraries
libraries <- c("jsonlite", "ggplot2")

for(lib in libraries){
  eval(bquote(library(.(lib))))
}

if (!require("pacman")) install.packages("pacman")
pacman::p_load(shiny, ggplot2, plotly, shinythemes, shinyWidgets, highcharter, DT)

df = data.frame(
  zone = c("Boston", "NY", "Chicago"),
  teenagers = c(533, 489, 584),
  adults = c(120, 201, 186),
  elder = c(156, 153, 246)
)


ui2 <- navbarPage(
  
  paste('Vaccination Evolution in USA'),
  
  theme = shinytheme("cerulean"),
  
  tabPanel('Evolution by age',
           
           sidebarLayout(
             
             sidebarPanel(
               selectInput('variable', h5('Select the age range to visualize'),
                           choices = c("Teens" = 2,
                                       "Adults" = 3, 
                                       "Elder" = 4), 
                           selected=2
                          ),
               helpText("Age range in USA")
                         ),
             
             mainPanel(
               textOutput("text1"),
               titlePanel(h4('Evolution of the vaccination in USA by age and zone')),
               highchartOutput('histogram'),
               br(),
               helpText("Interact with the graph")
                      )
             
                     )
          )
     )





#   Server building
server2 <- function(input, output) {
  
  output$text1 <- renderText({ 
    colm = as.numeric(input$variable)
    paste("Age group shown is:", names(df[colm]))
    
  })
  
  output$histogram <- renderHighchart({
    
    colm = as.numeric(input$variable)
    
    hchart(df, type = 'column', hcaes(x = df[, 1], y = df[, colm]), name = "Number of people vaccinated")%>%
      
      hc_title(text = paste("Number of people vaccinated with at least one dose" ),
               style = list(fontWeight = "bold", fontSize = "20px"), align = "center")%>% 
      
      hc_yAxis(title=list(text=paste("Number")))%>%
      
      hc_xAxis(title=list(text=paste('Region')))%>%
      
      hc_add_theme(hc_theme_ggplot2())
  })
  
  
}

#shiny APP
shinyApp(ui = ui2, server = server2)

Upvotes: 0

Views: 92

Answers (1)

VitaminB16
VitaminB16

Reputation: 1234

You should be passing variable names into hcaes. The y-variable is names(df[colm])), and it can be converted into symbolic expression using !!sym():

output$histogram <- renderHighchart({
        
        colm = as.numeric(input$variable)
        
        hchart(df, type = 'column', hcaes(x = zone, y = !!sym(names(df[colm]))), name = "Number of people vaccinated")%>%
            
            hc_title(text = paste("Number of people vaccinated with at least one dose" ),
                     style = list(fontWeight = "bold", fontSize = "20px"), align = "center")%>% 
            
            hc_yAxis(title=list(text=paste("Number")))%>%
            
            hc_xAxis(title=list(text=paste('Region')))%>%
            
            hc_add_theme(hc_theme_ggplot2())
    })

Upvotes: 1

Related Questions