passcot
passcot

Reputation: 199

checkboxInput value R shiny: if TRUE then

I have the following code. The objective is to make the position of the plot bars reactive to the selectInput value

library(shiny)
library(shinyWidgets)
library(tidyverse)
library(DT)
library(shinythemes)
library(plotly)
library(ggthemes)
library(lubridate)



data <- data.frame(mitarbeiter = c("AA", "BB", "CC", "DD", "EE", "FF"), 
         art = c("hr", "GG", "TT", "RR", "OO", "OO"),
         creadate = as_date(c("2018-01-03", "2018-01-03", "2018-01-03", "2018-01-03", "2018-01-03", "2018-01-03")))

mitarbeiter1 <- sort(unique(data$mitarbeiter))
art1 <- sort(unique(data$art))

year_month <- function(dates) {
  paste(lubridate::year(dates),
        str_pad(lubridate::month(dates), width = 2, pad = 0),
        sep="-")
}

year_week <- function(dates) {
  paste(lubridate::year(dates),
        str_pad(lubridate::week(dates), width = 2, pad = 0),
        sep="-")
}

year_day <- function(dates) {
  paste(lubridate::year(dates),
        str_pad(lubridate::month(dates), width = 2, pad = 0),
        str_pad(lubridate::day(dates), width = 2, pad = 0),
        sep="-")
}


ui <- fluidPage(
  fluidRow(
    column(4,
           pickerInput("mitarbeiterName", "Name des Mitarbeiters", mitarbeiter1, 
                       options = list(`actions-box` = TRUE), multiple = TRUE),
           pickerInput("artName", "Art", art1, 
                       options = list(`actions-box` = TRUE), multiple = TRUE),
           pickerInput("period", "Zeitraum", c("day", "week", "month", "year"), 
                       options = list(`actions-box` = TRUE)),
           dateRangeInput("date", "Datum auswahlen", start  = "2020-01-01"),
           checkboxInput("kumulativ", "Kumulativ"),
           downloadButton("download", "Download")
    ),
    column(8,
           plotlyOutput("policyPlot")
    )
  )
)

server <- function(input, output, session) {
  
  #create a reactive object with a NULL starting value
  listofrows <- reactiveValues(data = NULL)
  
  #observe the changes in inputs and update the reactive object 
  observeEvent(c(input$mitarbeiterName, input$artName, input$date, input$period), {
    req(input$mitarbeiterName)
    req(input$artName)
    req(input$period)
    req(input$date)

    listofrows$data <- subset(data, mitarbeiter %in% input$mitarbeiterName &
                                art %in% input$artName & 
                                creadate >= input$date[1] & creadate <= input$date[2]) 
  }, ignoreInit = T, ignoreNULL = TRUE)
  
  output$policyPlot <- renderPlotly({
    req(listofrows$data)
    req(input$kumulativ)
    
    fn <- switch(
      input$period,
      day = year_day,
      week = year_week,
      month = year_month,
      year = year
    )
    
    pos <- if (input$kumulativ) "dodge" else "identity"
    
    ggplot(listofrows$data) +
      geom_bar(aes(x = fn(creadate), fill = mitarbeiter), 
               stat = "count", 
               position = pos,
               show.legend = T) +
      ggtitle("Anzahl erstellte Policen (pro Mitarbeiter)") +
      xlab("Zeitraum") + ylab("Anzahl der Policen")
  })
  
  output$download <- downloadHandler(
    filename = function() {
      paste("data-", Sys.Date(), ".png", sep = "")
    },
    content = function(file) {
      ggsave(file, plot = output$policyPlot)
    })
}

shinyApp(ui, server)

Now, I want:

does someone have any suggestion how to do that? How can we do the if condition with the checkbox value?

Upvotes: 1

Views: 917

Answers (1)

starja
starja

Reputation: 10365

In your case, req(input$kumulativ) doesn't work. It's because req checks if a value is "truthy", and FALSE is not considered truthy. Therefore, you can change it to:

req(!is.null(input$kumulativ))

Upvotes: 3

Related Questions