Real Effective Exchange Rates, Monthly

Data - BIS

Info

source dataset .html .RData

bis

EER

2024-06-17 2024-05-10

Data on xrates

source dataset .html .RData

bdf

EXR

2024-06-19 2024-06-18

bis

EER

2024-06-17 2024-05-10

bis

EER_D

2024-06-19 2024-05-10

bis

XRU

2024-05-10 2024-06-07

bis

XRU_D

2024-06-17 2024-05-10

ecb

EXR

2024-06-19 2024-06-15

eurostat

ert_bil_eur_d

2024-06-18 2024-06-08

eurostat

ert_h_eur_d

2024-06-18 2024-06-08

fred

xrates

2024-06-18 2024-06-07

gfd

xrates

2024-06-18 2021-01-08

oecd

REFSERIES_MSIT

2024-06-18 2024-04-30

oecd

SNA_TABLE4

2024-06-18 2024-04-30

wdi

PA.NUS.FCRF

2024-06-19 2024-04-30

Data on monetary policy

source dataset .html .RData

bdf

FM

2024-06-19 2024-06-18

bdf

MIR

2024-06-19 2024-06-18

bdf

MIR1

2024-06-19 2024-06-18

bis

CBPOL

2024-06-19 2024-06-07

ecb

BSI

2024-06-19 2024-05-21

ecb

BSI_PUB

2024-06-19 2024-06-15

ecb

FM

2024-06-19 2024-06-15

ecb

ILM

2024-06-19 2024-06-15

ecb

ILM_PUB

2024-06-19 2024-01-25

ecb

liq_daily

2024-06-19 2024-05-21

ecb

MIR

2024-06-19 2024-06-08

ecb

RAI

2024-06-07 2024-06-07

ecb

SUP

2024-06-17 2024-06-07

ecb

YC

2024-06-17 2024-05-21

ecb

YC_PUB

2024-06-17 2024-06-07

eurostat

ei_mfir_m

2024-06-18 2024-06-08

eurostat

irt_st_m

2024-06-18 2024-06-18

fred

r

2024-06-18 2024-06-07

oecd

MEI

2024-04-16 2024-04-15

oecd

MEI_FIN

2024-06-19 2024-05-21

LAST_COMPILE

LAST_COMPILE
2024-06-20

Last

date Nobs
2023-12-01 181

iso3c, iso2c, Reference area

Code
EER %>%
  arrange(iso3c, date) %>%
  group_by(iso3c, iso2c, `Reference area`, FREQ) %>%
  summarise(Nobs = n(),
            start = first(date),
            end = last(date)) %>%
  arrange(-Nobs) %>%
  mutate(Flag = gsub(" ", "-", str_to_lower(`Reference area`)),
         Flag = paste0('<img src="../../bib/flags/vsmall/', Flag, '.png" alt="Flag">')) %>%
  mutate(html = paste0('<a  target=_blank href=EER.html#', gsub(" ", "_", `Reference area`), '> Link </a>')) %>%
  select(Flag, everything()) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F, escape = F) else .}

EER_TYPE

Code
EER %>%
  group_by(EER_TYPE, Type) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
EER_TYPE Type Nobs
R Real 42480
N Nominal 41760

EER_BASKET

Code
EER %>%
  group_by(EER_BASKET, Basket) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
EER_BASKET Basket Nobs
B Broad (64 economies) 46080
N Narrow (27 economies) 38160

Individual Countries

Argentina

All

Code
EER %>%
  filter(iso3c %in% c("ARG")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("Exchange Rate ($? = National Currency)") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.7, 0.90),
        legend.title = element_blank())

2000-

Code
EER %>%
  filter(iso3c %in% c("ARG"),
         date >= as.Date("2000-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("Exchange Rate ($? = National Currency)") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.7, 0.90),
        legend.title = element_blank())

2010-

Code
EER %>%
  filter(iso3c %in% c("ARG"),
         date >= as.Date("2010-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("Exchange Rate ($? = National Currency)") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.2, 0.2),
        legend.title = element_blank())

United States

All

Code
EER %>%
  filter(iso3c %in% c("USA")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("Exchange Rate ($? = National Currency)") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.7, 0.90),
        legend.title = element_blank())

1964-1979

Code
EER %>%
  filter(iso3c %in% c("USA"),
         date <= as.Date("1979-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  group_by(variable) %>%
  mutate(value = 100* value/value[date == as.Date("1970-01-01")]) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("Exchange Rate ($? = National Currency)") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.2, 0.2),
        legend.title = element_blank())

1964-1987

Code
EER %>%
  filter(iso3c %in% c("USA"),
         date <= as.Date("1987-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("Exchange Rate ($? = National Currency)") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.2, 0.90),
        legend.title = element_blank())

1980

Code
EER %>%
  filter(iso2c %in% c("US"),
         date >= as.Date("1980-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.65, 0.8),
        legend.title = element_blank())

1990

Code
EER %>%
  filter(iso2c %in% c("US"),
         date >= as.Date("1990-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.65, 0.8),
        legend.title = element_blank())

2000

Code
EER %>%
  filter(iso2c %in% c("US"),
         date >= as.Date("2000-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.5, 0.8),
        legend.title = element_blank())

2010

Code
EER %>%
  filter(iso2c %in% c("US"),
         date >= as.Date("2010-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.7, 0.2),
        legend.title = element_blank())

2009-2014

Code
EER %>%
  filter(iso2c %in% c("US"),
         date >= as.Date("2009-01-01"),
         date <= as.Date("2014-12-31")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 5),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.5, 0.8),
        legend.title = element_blank())

2017-

Code
EER %>%
  filter(iso2c %in% c("US"),
         date >= as.Date("2016-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 5),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.5, 0.8),
        legend.title = element_blank())

Japan

All

Code
EER %>%
  filter(iso3c %in% c("JPN")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("Exchange Rate ($? = National Currency)") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.7, 0.30),
        legend.title = element_blank())

1980

Code
EER %>%
  filter(iso3c %in% c("JPN"),
         date >= as.Date("1980-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.65, 0.25),
        legend.title = element_blank())

1990

Code
EER %>%
  filter(iso3c %in% c("JPN"),
         date >= as.Date("1990-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.65, 0.85),
        legend.title = element_blank())

2000

Code
EER %>%
  filter(iso3c %in% c("JPN"),
         date >= as.Date("2000-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.9),
        legend.title = element_blank())

2010

Code
EER %>%
  filter(iso3c %in% c("JPN"),
         date >= as.Date("2010-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.7, 0.85),
        legend.title = element_blank())

2009-2014

Code
EER %>%
  filter(iso3c %in% c("JPN"),
         date >= as.Date("2009-01-01"),
         date <= as.Date("2014-12-31")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 5),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.3, 0.3),
        legend.title = element_blank())

New Zealand

All

Code
EER %>%
  filter(iso3c %in% c("NZL")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("Exchange Rate ($? = National Currency)") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.7, 0.7),
        legend.title = element_blank())

1980

Code
EER %>%
  filter(iso3c %in% c("NZL"),
         date >= as.Date("1980-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.65, 0.25),
        legend.title = element_blank())

1990

Code
EER %>%
  filter(iso3c %in% c("NZL"),
         date >= as.Date("1990-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.65, 0.3),
        legend.title = element_blank())

2000

Code
EER %>%
  filter(iso3c %in% c("NZL"),
         date >= as.Date("2000-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.3),
        legend.title = element_blank())

2010

Code
EER %>%
  filter(iso3c %in% c("NZL"),
         date >= as.Date("2010-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.7, 0.85),
        legend.title = element_blank())

2009-2014

Code
EER %>%
  filter(iso3c %in% c("NZL"),
         date >= as.Date("2009-01-01"),
         date <= as.Date("2014-12-31")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 5),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.3, 0.3),
        legend.title = element_blank())

Europe

All

Code
EER %>%
  filter(iso2c %in% c("XM")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.2, 0.15),
        legend.title = element_blank())

1990

Code
EER %>%
  filter(iso2c %in% c("XM"),
         date >= as.Date("1990-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.7, 0.2),
        legend.title = element_blank())

2000

Code
EER %>%
  filter(iso2c %in% c("XM"),
         date >= as.Date("2000-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2024, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.7, 0.2),
        legend.title = element_blank())

2010

Code
EER %>%
  filter(iso2c %in% c("XM"),
         date >= as.Date("2010-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("Euro BIS Real Exchange Rate") +
  
  scale_x_date(breaks = seq(1940, 2026, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 5),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.85),
        legend.title = element_blank())

2009-2014

Code
EER %>%
  filter(iso2c %in% c("XM"),
         date >= as.Date("2009-01-01"),
         date <= as.Date("2014-12-31")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 5),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.6, 0.8),
        legend.title = element_blank())

2017-

Code
EER %>%
  filter(iso2c %in% c("XM"),
         date >= as.Date("2017-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 5),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.6, 0.8),
        legend.title = element_blank())

Israel

All

Code
EER %>%
  filter(iso3c %in% c("ISR")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("Exchange Rate ($? = National Currency)") +
  scale_color_manual(values = viridis(3)[1:2]) +
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.3, 0.90),
        legend.title = element_blank())

1990

Code
EER %>%
  filter(iso3c %in% c("ISR"),
         date >= as.Date("1990-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  scale_color_manual(values = viridis(3)[1:2]) +
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.65, 0.8),
        legend.title = element_blank())

2000

Code
EER %>%
  filter(iso3c %in% c("ISR"),
         date >= as.Date("2000-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  scale_color_manual(values = viridis(3)[1:2]) +
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.5, 0.8),
        legend.title = element_blank())

2010

Code
EER %>%
  filter(iso3c %in% c("ISR"),
         date >= as.Date("2010-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  scale_color_manual(values = viridis(3)[1:2]) +
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.2, 0.9),
        legend.title = element_blank())

2009-2014

Code
EER %>%
  filter(iso3c %in% c("ISR"),
         date >= as.Date("2009-01-01"),
         date <= as.Date("2014-12-31")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  scale_color_manual(values = viridis(3)[1:2]) +
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 5),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.2, 0.9),
        legend.title = element_blank())

Australia

All

Code
EER %>%
  filter(iso3c %in% c("AUS")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("Exchange Rate ($? = National Currency)") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.7, 0.8),
        legend.title = element_blank())

1990

Code
EER %>%
  filter(iso3c %in% c("AUS"),
         date >= as.Date("1990-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.25, 0.85),
        legend.title = element_blank())

2000

Code
EER %>%
  filter(iso3c %in% c("AUS"),
         date >= as.Date("2000-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.2),
        legend.title = element_blank())

2010

Code
EER %>%
  filter(iso3c %in% c("AUS"),
         date >= as.Date("2010-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.7, 0.85),
        legend.title = element_blank())

Switzerland

All

Code
EER %>%
  filter(iso3c %in% c("CHE")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.2),
        legend.title = element_blank())

1990-

Code
EER %>%
  filter(iso3c %in% c("CHE"),
         date >= as.Date("1990-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.2),
        legend.title = element_blank())

2000-

Code
EER %>%
  filter(iso3c %in% c("CHE"),
         date >= as.Date("2000-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.2),
        legend.title = element_blank())

2010-

Code
EER %>%
  filter(iso3c %in% c("CHE"),
         date >= as.Date("2010-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.2),
        legend.title = element_blank())

Iceland

All

Code
EER %>%
  filter(iso3c %in% c("ISL")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.2, 0.2),
        legend.title = element_blank())

2000-

Code
EER %>%
  filter(iso3c %in% c("ISL"),
         date >= as.Date("2000-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.8),
        legend.title = element_blank())

2010-

Code
EER %>%
  filter(iso3c %in% c("ISL"),
         date >= as.Date("2010-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.2, 0.8),
        legend.title = element_blank())

China

Code
EER %>%
  filter(iso3c %in% c("CHN")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.2, 0.9),
        legend.title = element_blank())

Denmark

Code
EER %>%
  filter(iso3c %in% c("DNK")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.2),
        legend.title = element_blank())

Germany

Code
EER %>%
  filter(iso3c %in% c("DEU")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.2),
        legend.title = element_blank())

France

Code
EER %>%
  filter(iso3c %in% c("FRA")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + 
  geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.8),
        legend.title = element_blank())

Italy

Code
EER %>%
  filter(iso3c %in% c("ITA")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + 
  geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.8),
        legend.title = element_blank())

United Kingdom

All

Code
EER %>%
  filter(iso3c %in% c("GBR")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + 
  geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.8),
        legend.title = element_blank())

1990-

Code
EER %>%
  filter(iso3c %in% c("GBR"),
         date >= as.Date("1990-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + 
  geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.8),
        legend.title = element_blank())

2000-

Code
EER %>%
  filter(iso3c %in% c("GBR"),
         date >= as.Date("2000-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + 
  geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.8),
        legend.title = element_blank())

2010-

Code
EER %>%
  filter(iso3c %in% c("GBR"),
         date >= as.Date("2010-01-01")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + 
  geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.8, 0.8),
        legend.title = element_blank())

Canada

Code
EER %>%
  filter(iso3c %in% c("CAN")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + 
  geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.2, 0.2),
        legend.title = element_blank())

Sweden

Code
EER %>%
  filter(iso3c %in% c("SWE")) %>%
  mutate(variable = paste0(Type, ", ", Basket)) %>%
  ggplot(.) + 
  geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  theme(legend.position = c(0.2, 0.2),
        legend.title = element_blank())

Germany, France, United States

Real Exchange rates

Code
EER %>%
  filter(iso3c %in% c("DEU", "FRA", "ITA", "ESP"),
         EER_BASKET == "N",
         EER_TYPE == "R") %>%
  ggplot(.) + 
  geom_line(aes(x = date, y = value, color = iso3c, linetype = iso3c)) + 
  theme_minimal() + xlab("") + ylab("Exchange Rate ($1 = ? National Currency)") +
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 200, 10),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  
  theme(legend.position = c(0.7, 0.90),
        legend.title = element_blank(),
        legend.direction = "horizontal")

Nominal Exchange rates

Code
EER %>%
  filter(iso3c %in% c("DEU", "FRA", "ITA", "ESP"),
         EER_BASKET == "N",
         EER_TYPE == "N") %>%
  ggplot(.) + 
  geom_line(aes(x = date, y = value, color = iso3c, linetype = iso3c)) + 
  theme_minimal() + xlab("") + ylab("") +
  scale_x_date(breaks = seq(1940, 2022, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 600, 50),
                labels = dollar_format(accuracy = 1, prefix = "")) +
  
  theme(legend.position = c(0.7, 0.90),
        legend.title = element_blank(),
        legend.direction = "horizontal")