library(tidyverse)
library(sf)
library(rnaturalearth)
library(rnaturalearthdata)
library(patchwork)
library(eurostat)
prc_hicp_mmor <- get_eurostat("prc_hicp_mmor", type = "code", time_format = "date") %>%
mutate_if(is_character, as_factor)
eurasia<-ne_countries(scale = 50,
type = "countries",
continent = c("Europe", "Asia"),
country = NULL,
geounit = NULL,
sovereignty = NULL,
returnclass = c("sf")) %>%
select(name, iso_a2, continent, subregion, geometry) %>%
mutate(iso_a2 = fct_recode(iso_a2, "UK" = "GB", "EL" = "GR"))
*Note: UK data covers only years 2019 and 2020