闪亮的图不显示数据

时间:2020-03-23 15:11:49

标签: r shiny shinydashboard

我正在尝试构建一个闪亮的应用程序,以显示ECDC网站上每天更新的10个受影响最严重国家的COVID-19案例。我希望能够使用滑块输入来限制病例和死亡,并使用日期输入来选择日期周期(所有这些均已添加)。 代码在下面,但是当我运行该应用程序时,我得到一个空白图,该轴显示正确,但是我无法显示要显示的点。该代码应该可以在任何计算机上运行,​​因为代码只需从ECDC页面下载数据集即可。 有解决方案吗?

library(shiny)
library(readxl)
library(dplyr)
library(httr)
library(ggplot2)
library(plotly)

url <- paste("https://www.ecdc.europa.eu/sites/default/files/documents/COVID-19-geographic-disbtribution-worldwide-",format(Sys.time(), "%Y-%m-%d"), ".xlsx", sep = "")

GET(url, authenticate(":", ":", type="ntlm"), write_disk(tf <- tempfile(fileext = ".xlsx")))

data <- read_excel(tf)

include<-c("United_Kingdom","Italy","France","China",
           "United_States_of_America","Spain","Germany",
           "Iran","South_Korea","Switzerland")
ui <- fluidPage(

    titlePanel("COVID-19 Daily Confirmed Cases & Deaths"),

    sidebarLayout(
        sidebarPanel(
            checkboxGroupInput("Country", "Select Country", selected = NULL, inline = FALSE,
                         width = NULL),
            dateRangeInput("DateRep","Select Date Range", start = "2019-12-31", end = NULL),
            sliderInput("Cases","Select Cases Range", min = 1, max = 20000, value = NULL),
            sliderInput("Deaths", "Select Death Range", min = 1, max = 10000, value = 100),
            submitButton("Refresh")


        ),

        mainPanel(
           plotOutput("plot")
        )
    )
)

server <- function(input, output) {

    output$plot <- renderPlot({

        include<-input$Country

        plot_data<-filter(data, `Countries and territories` %in% include)%>%
            filter(between(input$Cases))

        plot_data%>% ggplot(aes(x=input$DateRep, y=input$Cases, size =input$Deaths, color = input$Country)) +
            geom_point(alpha=0.5) +
            theme_light()

    })
}

shinyApp(ui = ui, server = server)

2 个答案:

答案 0 :(得分:0)

我开始解决此问题,但时间用尽了...所以这就是我所做的,也许您可​​以完成它...

library(shiny)
library(readxl)
library(dplyr)
library(httr)
library(ggplot2)
library(plotly)

url <- paste("https://www.ecdc.europa.eu/sites/default/files/documents/COVID-19-geographic-disbtribution-worldwide-",format(Sys.time(), "%Y-%m-%d"), ".xlsx", sep = "")

GET(url, authenticate(":", ":", type="ntlm"), write_disk(tf <- tempfile(fileext = ".xlsx")))

data <- read_excel(tf)

ui <- fluidPage(

  titlePanel("COVID-19 Daily Confirmed Cases & Deaths"),

  sidebarLayout(
    sidebarPanel(
      uiOutput("country_checkbox"),
      dateRangeInput("DateRep","Select Date Range", start = "2019-12-31", end = NULL),
      sliderInput("Cases","Select Cases Range", min = 1, max = 20000, value = NULL),
      sliderInput("Deaths", "Select Death Range", min = 1, max = 10000, value = 100)
      #submitButton("Refresh")


    ),

    mainPanel(
      plotOutput("plot")
    )
  )
)

server <- function(input, output) {

  output$country_checkbox <- renderUI({
    countries <- unique(data.frame(data)[, "Countries.and.territories"])
    checkboxGroupInput("country", "Select Country", 
                       choices = countries,
                       selected = NULL, inline = FALSE,
                       width = NULL)
  })

  output$plot <- renderPlot({

    include<-input$country

    plot_data<-filter(data, `Countries and territories` %in% include)%>%
      filter(between(Cases, 1, input$Cases))

    plot_data%>% ggplot(aes(x=DateRep, y=Cases, size =Deaths, color = `Countries and territories`)) +
      geom_point(alpha=0.5) +
      theme_light()

  })
}

shinyApp(ui = ui, server = server)

答案 1 :(得分:0)

我认为最好在reactive之外的renderPlot表达式中定义和过滤要绘制的数据。这样一来,您可以更轻松地重用这些数据,并且(从我的角度来看)更容易使用ggplot而不直接输入数据。

我在as.Date(DateRep) >= input$DateRep[1] & as.Date(DateRep) <= input$DateRep[2])中包含filter,以选择两个选定日期之间的间隔。由于列DateRep具有POSIXct格式,因此您需要在其上使用as.Date将其转换为dateRangeInput产生的格式。

结果如下:

library(shiny)
library(readxl)
library(dplyr)
library(httr)
library(ggplot2)
library(plotly)

url <- paste("https://www.ecdc.europa.eu/sites/default/files/documents/COVID-19-geographic-disbtribution-worldwide-",format(Sys.time(), "%Y-%m-%d"), ".xlsx", sep = "")

GET(url, authenticate(":", ":", type="ntlm"), write_disk(tf <- tempfile(fileext = ".xlsx")))

data <- read_excel(tf)

include<-c("United_Kingdom","Italy","France","China",
           "United_States_of_America","Spain","Germany",
           "Iran","South_Korea","Switzerland")
ui <- fluidPage(

  titlePanel("COVID-19 Daily Confirmed Cases & Deaths"),

  sidebarLayout(
    sidebarPanel(
      checkboxGroupInput("Country", "Select Country", choices = include, selected = "France"),
      dateRangeInput("DateRep","Select Date Range", start = "2019-12-31", end = NULL),
      sliderInput("Cases","Select Cases Range", min = 1, max = 20000, value = NULL),
      sliderInput("Deaths", "Select Death Range", min = 1, max = 10000, value = 100),
      submitButton("Refresh")

    ),

    mainPanel(
      plotOutput("plot")
    )
  )
)

server <- function(input, output) {

  plot_data <- reactive({
    filter(data, `Countries and territories` %in% input$Country 
           & as.Date(DateRep) >= input$DateRep[1]
           & as.Date(DateRep) <= input$DateRep[2]) %>%
       filter(between(Cases, 1, input$Cases))
  })

  output$plot <- renderPlot({
    plot_data() %>% 
      ggplot(aes(x = as.Date(DateRep), y= Cases, size = Deaths, color = `Countries and territories`)) +
      geom_point(alpha=0.5) +
      theme_light()
  })
}

shinyApp(ui = ui, server = server)

enter image description here