| LAST_DOWNLOAD |
|---|
| 2024-03-12 |
Real Minimum Wages - RMW
Data - OECD
Info
LAST_DOWNLOAD
LAST_COMPILE
| LAST_COMPILE |
|---|
| 2025-12-26 |
Last, Monthly
| obsTime | Nobs |
|---|---|
| 2022 | 140 |
SERIES
Code
RMW %>%
left_join(RMW_var$SERIES, by = c("SERIES")) %>%
group_by(SERIES, Series) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
print_table_conditional()| SERIES | Series | Nobs |
|---|---|---|
| EXR | In 2021 constant prices at 2021 USD exchange rates | 2727 |
| PPP | In 2021 constant prices at 2021 USD PPPs | 2727 |
PERIOD
Code
RMW %>%
left_join(RMW_var$PERIOD, by = c("PERIOD")) %>%
group_by(PERIOD, Period) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
print_table_conditional()| PERIOD | Period | Nobs |
|---|---|---|
| A | Annual | 2728 |
| H | Hourly | 2726 |
COUNTRY
Code
RMW %>%
left_join(RMW_var$COUNTRY, by = "COUNTRY") %>%
group_by(COUNTRY, Country) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
mutate(Flag = gsub(" ", "-", str_to_lower(gsub(" ", "-", Country))),
Flag = paste0('<img src="../../icon/flag/vsmall/', Flag, '.png" alt="Flag">')) %>%
select(Flag, everything()) %>%
{if (is_html_output()) datatable(., filter = 'top', rownames = F, escape = F) else .}obsTime
Code
RMW %>%
group_by(obsTime) %>%
summarise(Nobs = n()) %>%
arrange(desc(obsTime)) %>%
print_table_conditional()2020
Code
RMW %>%
left_join(RMW_var$COUNTRY, by = "COUNTRY") %>%
left_join(RMW_var$SERIES, by = "SERIES") %>%
left_join(RMW_var$PERIOD, by = "PERIOD") %>%
filter(obsTime == "2020") %>%
select_if(~ n_distinct(.) > 1) %>%
transmute(COUNTRY, Country,
variable = paste0(Series, " - ", Period), obsValue) %>%
spread(variable, obsValue) %>%
mutate(Flag = gsub(" ", "-", str_to_lower(gsub(" ", "-", Country))),
Flag = paste0('<img src="../../icon/flag/vsmall/', Flag, '.png" alt="Flag">')) %>%
select(Flag, everything()) %>%
{if (is_html_output()) datatable(., filter = 'top', rownames = F, escape = F) else .}France, United States, Germany, Italy
PPP
Code
RMW %>%
filter(SERIES == "PPP",
PERIOD == "H",
COUNTRY %in% c("FRA", "USA", "DEU", "ITA", "ESP")) %>%
left_join(RMW_var$COUNTRY, by = "COUNTRY") %>%
year_to_date() %>%
left_join(colors, by = c("Country" = "country")) %>%
rename(Location = Country) %>%
ggplot(.) + geom_line(aes(x = date, y = obsValue, color = color)) +
scale_color_identity() + add_4flags + theme_minimal() +
scale_x_date(breaks = seq(1920, 2025, 5) %>% paste0("-01-01") %>% as.Date,
labels = date_format("%y")) +
scale_y_log10(breaks = seq(1, 500, 1),
labels = scales::dollar_format(accuracy = 1)) +
ylab("PPP") + xlab("")
EXR
Code
RMW %>%
filter(SERIES == "EXR",
PERIOD == "H",
COUNTRY %in% c("FRA", "USA", "DEU", "ITA", "ESP")) %>%
left_join(RMW_var$COUNTRY, by = "COUNTRY") %>%
year_to_date() %>%
left_join(colors, by = c("Country" = "country")) %>%
rename(Location = Country) %>%
ggplot(.) + geom_line(aes(x = date, y = obsValue, color = color)) +
scale_color_identity() + add_4flags + theme_minimal() +
scale_x_date(breaks = seq(1920, 2025, 5) %>% paste0("-01-01") %>% as.Date,
labels = date_format("%y")) +
scale_y_log10(breaks = seq(1, 500, 1),
labels = scales::dollar_format(accuracy = 1)) +
ylab("EXR") + xlab("")
Australia, Australia, Mexico, France
PPP
Code
RMW %>%
filter(SERIES == "PPP",
PERIOD == "H",
COUNTRY %in% c("AUS", "MEX", "USA", "FRA")) %>%
left_join(RMW_var$COUNTRY, by = "COUNTRY") %>%
year_to_date() %>%
left_join(colors, by = c("Country" = "country")) %>%
rename(Location = Country) %>%
ggplot(.) + geom_line(aes(x = date, y = obsValue, color = color)) +
scale_color_identity() + add_4flags + theme_minimal() +
scale_x_date(breaks = seq(1920, 2025, 5) %>% paste0("-01-01") %>% as.Date,
labels = date_format("%y")) +
scale_y_log10(breaks = seq(1, 500, 1),
labels = scales::dollar_format(accuracy = 1)) +
ylab("PPP") + xlab("")