sts_inpi_a %>%
left_join(s_adj, by = "s_adj") %>%
group_by(s_adj, S_adj) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
{if (is_html_output()) print_table(.) else .}
s_adj | S_adj | Nobs |
---|---|---|
NSA | Unadjusted data (i.e. neither seasonally adjusted nor calendar adjusted data) | 187164 |
sts_inpi_a %>%
left_join(unit, by = "unit") %>%
group_by(unit, Unit) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
{if (is_html_output()) print_table(.) else .}
unit | Unit | Nobs |
---|---|---|
I15 | Index, 2015=100 | 72095 |
PCH_SM | Percentage change compared to same period in previous year | 68903 |
I10 | Index, 2010=100 | 46166 |
sts_inpi_a %>%
left_join(indic_bt, by = "indic_bt") %>%
group_by(indic_bt, Indic_bt) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
{if (is_html_output()) print_table(.) else .}
indic_bt | Indic_bt | Nobs |
---|---|---|
IMPR | Import price index | 95966 |
IMPX | Import price index - non euro area | 49999 |
IMPZ | Import price index - euro area | 41199 |
sts_inpi_a %>%
left_join(geo, by = "geo") %>%
group_by(geo, Geo) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
mutate(Geo = ifelse(geo == "DE", "Germany", Geo)) %>%
mutate(Flag = gsub(" ", "-", str_to_lower(Geo)),
Flag = paste0('<img src="../../bib/flags/vsmall/', Flag, '.png" alt="Flag">')) %>%
select(Flag, everything()) %>%
{if (is_html_output()) datatable(., filter = 'top', rownames = F, escape = F) else .}
sts_inpi_a %>%
filter(nace_r2 == "C",
geo %in% c("CH"),
unit == "I15") %>%
select(geo, indic_bt, time, values) %>%
#mutate(values = 100*values/values[time == "2000Q1"]) %>%
left_join(indic_bt, by = "indic_bt") %>%
time_to_date %>%
ggplot() + ylab("") + xlab("") + theme_minimal() +
geom_line(aes(x = date, y = values, color = Indic_bt)) +
scale_color_manual(values = viridis(4)[1:3]) +
scale_x_date(breaks = seq(1920, 2025, 2) %>% paste0("-01-01") %>% as.Date,
labels = date_format("%y")) +
theme(legend.position = c(0.25, 0.25),
legend.title = element_blank()) +
scale_y_log10(breaks = seq(-60, 300, 1))
sts_inpi_a %>%
filter(nace_r2 == "C",
geo %in% c("NL"),
unit == "I15") %>%
select(geo, indic_bt, time, values) %>%
#mutate(values = 100*values/values[time == "2000Q1"]) %>%
left_join(indic_bt, by = "indic_bt") %>%
time_to_date %>%
ggplot() + ylab("") + xlab("") + theme_minimal() +
geom_line(aes(x = date, y = values, color = Indic_bt)) +
scale_color_manual(values = viridis(4)[1:3]) +
scale_x_date(breaks = seq(1920, 2025, 2) %>% paste0("-01-01") %>% as.Date,
labels = date_format("%y")) +
theme(legend.position = c(0.25, 0.25),
legend.title = element_blank()) +
scale_y_log10(breaks = seq(-60, 300, 10))
sts_inpi_a %>%
filter(nace_r2 == "C",
geo %in% c("FR"),
unit == "I15") %>%
select(geo, indic_bt, time, values) %>%
group_by(indic_bt) %>%
left_join(indic_bt, by = "indic_bt") %>%
time_to_date %>%
ggplot() + ylab("") + xlab("") + theme_minimal() +
geom_line(aes(x = date, y = values, color = Indic_bt)) +
scale_color_manual(values = viridis(4)[1:3]) +
scale_x_date(breaks = seq(1920, 2025, 2) %>% paste0("-01-01") %>% as.Date,
labels = date_format("%y")) +
theme(legend.position = c(0.25, 0.25),
legend.title = element_blank()) +
scale_y_log10(breaks = seq(-60, 300, 10))
sts_inpi_a %>%
filter(nace_r2 == "C",
geo %in% c("DE"),
unit == "I15") %>%
select(geo, indic_bt, time, values) %>%
group_by(indic_bt) %>%
left_join(indic_bt, by = "indic_bt") %>%
time_to_date %>%
ggplot() + ylab("") + xlab("") + theme_minimal() +
geom_line(aes(x = date, y = values, color = Indic_bt)) +
scale_color_manual(values = viridis(4)[1:3]) +
scale_x_date(breaks = seq(1920, 2025, 2) %>% paste0("-01-01") %>% as.Date,
labels = date_format("%y")) +
theme(legend.position = c(0.25, 0.85),
legend.title = element_blank()) +
scale_y_log10(breaks = seq(-60, 300, 10))
sts_inpi_a %>%
filter(nace_r2 == "C",
geo %in% c("SE"),
unit == "I15") %>%
select(geo, indic_bt, time, values) %>%
group_by(indic_bt) %>%
left_join(indic_bt, by = "indic_bt") %>%
time_to_date %>%
ggplot() + ylab("") + xlab("") + theme_minimal() +
geom_line(aes(x = date, y = values, color = Indic_bt)) +
scale_color_manual(values = viridis(4)[1:3]) +
scale_x_date(breaks = seq(1920, 2025, 2) %>% paste0("-01-01") %>% as.Date,
labels = date_format("%y")) +
theme(legend.position = c(0.25, 0.85),
legend.title = element_blank()) +
scale_y_log10(breaks = seq(-60, 300, 10))