## get current covid 19 Data
covid <- read.xlsx("https://www.ecdc.europa.eu/sites/default/files/documents/COVID-19-geographic-disbtribution-worldwide.xlsx")
covid_plot <- group_by(covid,countriesAndTerritories) %>% summarise(text = paste0(countryterritoryCode[1], " cases: ", sum(cases), " deaths: ",sum(deaths)))
## merge it with geolocation data of worlds capital cities
mapdata <- world.cities %>%
filter(capital == 1) %>%
transmute(country = country.etc, lat = lat, lng = long) %>%
left_join(covid_plot, ., by = c("countriesAndTerritories" = "country"))
Please note that cases_yesterday and deaths_yesterday refers to the data of 16, 4, 2020.
The datasets used for this visualisation are
- “COVID-19 Coronavirus data” provided by “EU Open Data Portal”, licenced under Creative Commons Attribution 4.0 International
- the “world.cities” dataset, provided by the R-package “maps”.
Please note that the shown data is completely static and will not update over time, even if the source data does.