简体   繁体   中英

R Shiny ggvis does not react on dynamic input

I try to build a shiny dashboard with ggvis barcharts. The idea is to display barcharts with top 10 costs for a particular month in a year. The user may choose a year and a month. The choice of months is dependend on the chosen year, so if choosing 2016 only the months to date can be selected.

Somehow I can't pass the value of the dynamic input field to the barchart. Though it works as long as both input fields are static (exchanging input$month1 with input$monthtest in the first lines of the server script shows you how it is supposed to look like). I have tried about everything I can think of from isolating() the input month to using observe() instead of reactive().

The error returned is: Warning: Error in eval: incorrect length (0), expecting: 12; ie somehow the value in the dynamic field is not passed to the reactive environment

Many thanks in advance!

Here is a "minimal" working example close enough to what my actual dashboard looks like:

#Minimal example Shiny dynamic field
#ggvis Barchart depending on static and dynamic dropdown

library("zoo")
library("shiny")
library("ggvis")
library("magrittr")
library("dplyr")
library("lubridate")

#data-------------
#in the actual code months are in German
month.loc <-  c("January","February","March","April","Mai", "June",
            "July","August","September","October","November", "December")

#generate data
Databc1M<-data.frame("date"=seq(as.Date("2015-01-01"), 
as.Date("2016-03-01"), by="months"), "cost1"=runif(15,min=0,max=100),
     "cost2"=runif(15,min=0,max=100), "cost3"=runif(15,min=0,max=100), 
     "cost4"=runif(15,min=0,max=100),
     "cost5"=runif(15,min=0,max=100), "cost6"=runif(15,min=0,max=100),
     "cost7"=runif(15,min=0,max=100),
     "cost8"=runif(15,min=0,max=100), "cost9"=runif(15,min=0,max=100),
     "cost10"=runif(15,min=0,max=100))

#ui-------------
ui <- fluidPage(
 ggvisOutput(plot_id = "Barcha_Abw"),
  selectInput(inputId = "Year1", label = h3("Choose a year"),
           choices = c(2015,2016), selected=2015
),
#Rendering plot works with static input field
selectInput(inputId = "monthtest", label = h3("Choose a month"),
           choices = month.loc[1:3], selected=month.loc[1]
),
uiOutput("bc1month")

)

#server-------------
server <- function(input, output, session) {
 output$bc1month <- renderUI({
 #filter available months in a given year
 outmonths<- Databc1M %>% dplyr::filter(format(Databc1M$date,"%Y")== 
 as.character(input$Year1)) %>% 
   .[[1]] %>% month() %>% month.loc[.]

 #dynamic dropdown; latest month selected
 selectInput(inputId = 'month1', label = h3("Choose a month
  (dynamic drop down)"), choices = outmonths, 
  #choose latest month in dataset
  selected= Databc1M[NROW(Databc1M),"date"] %>% month() %>%
  month.loc[.]) 
 })

#structure data and render barchart
TopAbw1 <- reactive({

 Dataaux <- Databc1M %>%
  dplyr::filter(format(Databc1M$date,"%Y")==input$Year1)

 #!!!!!! not working: match(input$month1,...); input$monthtest works
 Dataaux<-
 dplyr::filter(Dataaux,month(Dataaux$date)==match(input$month1,
 month.loc)) #input$month1
 Dataaux <- gather(Dataaux,key="cost_id",value="Abweichung")
 Dataaux <- Dataaux[-1,]

 Dataaux <- Dataaux[order(Dataaux$Abweichung,decreasing=TRUE),] %>%
  head(10)

 Dataaux$cost_id <- factor(Dataaux$cost_id, levels = Dataaux$cost_id)

 #render barchart 
 Dataaux %>% 
  ggvis(y=~abs(Abweichung),x=~cost_id) %>%
   layer_text(text:=~round(abs(Abweichung),2)) %>%
    layer_bars( stack =FALSE) %>%
     add_axis("x", title = "", properties = axis_props(labels =
      list(angle= 45, align = "left", fontSize = 12))) %>%
       add_axis("y", title = "Mio. EUR") 
})

TopAbw1 %>% bind_shiny("Barcha_Abw")

}

shinyApp(ui = ui, server = server)

I had a german version of the question. For the documentation purpose (and if anyone is curious about the answer:

#Minimal example Shiny dynamic field
#ggis Barchart soll nach Nutzereingabe in 2 Dropdowns neu gerendert werden
#Ein Dropdown ist dynamisch

library("zoo")
library("shiny")
library("ggvis")
library("magrittr")
library("dplyr")
library("lubridate")

#data-------------
month.loc <-  c("Januar","Februar","März","April","Mai", "Juni",
                "Juli","August","September","Oktober","November", "Dezember")

currdate <- as.Date("2015-01-01",format="%Y-%m-%d")

Databc1M<-data.frame("date"=seq(as.Date("2015-01-01"), as.Date("2016-03-01"), by="months"), "cost1"=runif(15,min=0,max=100),
                     "cost2"=runif(15,min=0,max=100), "cost3"=runif(15,min=0,max=100), "cost4"=runif(15,min=0,max=100),
                     "cost5"=runif(15,min=0,max=100), "cost6"=runif(15,min=0,max=100), "cost7"=runif(15,min=0,max=100),
                     "cost8"=runif(15,min=0,max=100), "cost9"=runif(15,min=0,max=100), "cost10"=runif(15,min=0,max=100))




#ui-------------
ui <- fluidPage(
  ggvisOutput(plot_id = "Barcha_Abw"),
  selectInput(inputId = "Year1", label = h3("Wählen Sie ein Jahr"),
              choices = c(2015,2016), selected=2015
  ),
  #Test mit fixem dropdown funktioniert der Plot
  uiOutput("bc1month"),
  plotOutput("TopAbw1")

)
#server-------------
server <- function(input, output, session) {

  output$bc1month <- renderUI({

    outmonths<- Databc1M %>% dplyr::filter(format(Databc1M$date,"%Y")== input$Year1) %>% 
      .[[1]] %>% month() %>% month.loc[.]

    #input$Year1
    selectInput(inputId = 'month1', label = h3("Wählen Sie einen Monat (dynamisch)"), choices = outmonths) 

  })
  TopAbw1 <- reactive({

    Dataaux <- Databc1M[which(year(Databc1M$date) %in% input$Year1),]
    Dataaux <- Dataaux[which(months(Dataaux$date) %in% input$month1),]
    Dataaux <- gather(Dataaux,key="cost_id",value="Abweichung")
    Dataaux <- Dataaux[-1,]

    Dataaux <- Dataaux[order(Dataaux$Abweichung,decreasing=TRUE),] %>%
      head(10)

    Dataaux$cost_id <- factor(Dataaux$cost_id, levels = Dataaux$cost_id)

    Dataaux %>% 
      ggvis(y=~abs(Abweichung),x=~cost_id) #%>%
      #layer_text(text:=~round(abs(Abweichung),2)) %>%
      #layer_bars( stack =FALSE) %>%
      #add_axis("x", title = "", properties = axis_props(labels = list(angle = 45, align = "left", fontSize = 12))) %>%
      #add_axis("y", title = "Mio. EUR") 

  })
  TopAbw1 %>% bind_shiny("Barcha_Abw")

}
shinyApp(ui = ui, server = server)

The technical post webpages of this site follow the CC BY-SA 4.0 protocol. If you need to reprint, please indicate the site URL or the original address.Any question please contact:yoyou2525@163.com.

 
粤ICP备18138465号  © 2020-2024 STACKOOM.COM