Price level ratio of PPP conversion factor (GDP) to market exchange rate

Data - WDI

France, Germany

All

Code
PA.NUS.PPPC.RF %>%
  filter(iso2c %in% c("FR", "DE")) %>%
  left_join(iso2c, by = "iso2c") %>%
  year_to_date %>%
  left_join(colors, by = c("Iso2c" = "country")) %>%
  ggplot(.) + xlab("") + ylab("Price level ratio of PPP conversion factor (GDP)\nto market exchange rate") +
  geom_line(aes(x = date, y = value, color = color)) + 
  theme_minimal() + scale_color_identity() + add_2flags +
  scale_x_date(breaks = seq(1950, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0.1, 2, 0.1))

1998-

Code
PA.NUS.PPPC.RF %>%
  filter(iso2c %in% c("FR", "DE")) %>%
  left_join(iso2c, by = "iso2c") %>%
  year_to_date %>%
  left_join(colors, by = c("Iso2c" = "country")) %>%
  
  filter(date >= as.Date("1998-01-01")) %>%
  ggplot(.) + xlab("") + ylab("Price level ratio of PPP conversion factor (GDP)\nto market exchange rate") +
  geom_line(aes(x = date, y = value, color = color)) + 
  theme_minimal() + scale_color_identity() + add_2flags +
  scale_x_date(breaks = seq(1950, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0.1, 2, 0.1))

Germany, Japan, Switzerland

Code
PA.NUS.PPPC.RF %>%
  filter(iso2c %in% c("JP", "DE", "CH", "KR")) %>%
  left_join(iso2c, by = "iso2c") %>%
  mutate(Iso2c = ifelse(iso2c == "KR", "Korea", Iso2c)) %>%
  year_to_date %>%
  left_join(colors, by = c("Iso2c" = "country")) %>%
  
  ggplot(.) + xlab("") + ylab("Price level ratio of PPP conversion factor (GDP)\nto market exchange rate") +
  geom_line(aes(x = date, y = value, color = color)) + 
  theme_minimal() + scale_color_identity() + add_4flags +
  scale_x_date(breaks = seq(1950, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0.1, 2, 0.1))

Japan

Code
PA.NUS.PPPC.RF %>%
  filter(iso2c %in% c("JP")) %>%
  left_join(iso2c, by = "iso2c") %>%
  year_to_enddate %>%
  ggplot(.) + geom_line(aes(x = date, y = value)) +
  xlab("") + ylab("Price level ratio") + theme_minimal() +
  theme(legend.title = element_blank(),
        legend.position = c(0.2, 0.2)) +
  scale_x_date(breaks = seq(1950, 2100, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 10, 0.1))

Iceland (1990-2020)

Code
PA.NUS.PPPC.RF %>%
  year_to_enddate %>%
  filter(iso2c %in% c("IS"),
         date >= as.Date("1990-01-01")) %>%
  left_join(iso2c, by = "iso2c") %>%
  ggplot(.) + geom_line(aes(x = date, y = value)) +
  xlab("") + ylab("Price level ratio") + theme_minimal() +
  theme(legend.title = element_blank(),
        legend.position = c(0.2, 0.2)) +
  scale_x_date(breaks = seq(1950, 2100, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 10, 0.1))

China, France, Germany

Code
PA.NUS.PPPC.RF %>%
  filter(iso2c %in% c("CN", "FR", "DE")) %>%
  left_join(iso2c, by = "iso2c") %>%
  year_to_date %>%
  left_join(colors, by = c("Iso2c" = "country")) %>%
  
  ggplot(.) + xlab("") + ylab("Price level ratio of PPP conversion factor (GDP)\nto market exchange rate") +
  geom_line(aes(x = date, y = value, color = color)) + 
  theme_minimal() + scale_color_identity() + add_3flags +
  scale_x_date(breaks = seq(1950, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0.1, 2, 0.1))

Italy, Portugal, Spain

Code
PA.NUS.PPPC.RF %>%
  filter(iso2c %in% c("ES", "IT", "PT")) %>%
  left_join(iso2c, by = "iso2c") %>%
  year_to_date %>%
  left_join(colors, by = c("Iso2c" = "country")) %>%
  
  ggplot(.) + xlab("") + ylab("Price level ratio of PPP conversion factor (GDP)\nto market exchange rate") +
  geom_line(aes(x = date, y = value, color = color)) + 
  theme_minimal() + scale_color_identity() + add_3flags +
  scale_x_date(breaks = seq(1950, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0.1, 2, 0.1))

Spain, United Kingdom, United States

Code
PA.NUS.PPPC.RF %>%
  filter(iso2c %in% c("US", "GB", "ES")) %>%
  left_join(iso2c, by = "iso2c") %>%
  year_to_date %>%
  left_join(colors, by = c("Iso2c" = "country")) %>%
  
  ggplot(.) + xlab("") + ylab("Price level ratio of PPP conversion factor (GDP)\nto market exchange rate") +
  geom_line(aes(x = date, y = value, color = color)) + 
  theme_minimal() + scale_color_identity() + add_3flags +
  scale_x_date(breaks = seq(1950, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0.1, 2, 0.1))

Argentina, Chile, Venezuela

Code
PA.NUS.PPPC.RF %>%
  filter(iso2c %in% c("AR", "CL", "VE")) %>%
  left_join(iso2c, by = "iso2c") %>%
  mutate(Iso2c = ifelse(iso2c == "VE", "Venezuela", Iso2c)) %>%
  year_to_date %>%
  left_join(colors, by = c("Iso2c" = "country")) %>%
  
  ggplot(.) + xlab("") + ylab("Price level ratio of PPP conversion factor (GDP)\nto market exchange rate") +
  geom_line(aes(x = date, y = value, color = color)) + 
  theme_minimal() + scale_color_identity() + add_3flags +
  scale_x_date(breaks = seq(1950, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0.1, 2, 0.1))

Greece, Hong Kong, Mexico

Code
PA.NUS.PPPC.RF %>%
  filter(iso2c %in% c("GR", "HK", "MX")) %>%
  left_join(iso2c, by = "iso2c") %>%
  mutate(Iso2c = ifelse(iso2c == "HK", "Hong Kong", Iso2c)) %>%
  year_to_date %>%
  left_join(colors, by = c("Iso2c" = "country")) %>%
  
  ggplot(.) + xlab("") + ylab("Price level ratio of PPP conversion factor (GDP)\nto market exchange rate") +
  geom_line(aes(x = date, y = value, color = color)) + 
  theme_minimal() + scale_color_identity() + add_3flags +
  scale_x_date(breaks = seq(1950, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0.1, 2, 0.1))