Balance of payments by country - monthly data (BPM6) - bop_c6_m

Data - Eurostat

Info

source dataset .html .RData
eurostat bop_c6_m 2024-11-01 2024-11-05

Data on europe

source dataset .html .RData
eurostat bop_gdp6_q 2024-11-01 2024-10-09
eurostat nama_10_a10 2024-11-01 2024-10-08
eurostat nama_10_a10_e 2024-11-01 2024-11-05
eurostat nama_10_gdp 2024-11-01 2024-10-08
eurostat nama_10_lp_ulc 2024-11-01 2024-10-08
eurostat namq_10_a10 2024-11-01 2024-11-05
eurostat namq_10_a10_e 2024-11-01 2024-10-08
eurostat namq_10_gdp 2024-11-01 2024-10-08
eurostat namq_10_lp_ulc 2024-11-04 2024-11-04
eurostat namq_10_pc 2024-11-01 2024-10-08
eurostat nasa_10_nf_tr 2024-11-01 2024-10-08
eurostat nasq_10_nf_tr 2024-11-01 2024-10-09
eurostat tipsii40 2024-11-01 2024-11-01

LAST_COMPILE

LAST_COMPILE
2024-11-05

Last

Code
bop_c6_m %>%
  group_by(time) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(time)) %>%
  head(1) %>%
  print_table_conditional()
time Nobs
2024M08 30708

bop_item

Code
bop_c6_m %>%
  left_join(bop_item, by = "bop_item") %>%
  group_by(bop_item, Bop_item) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()

sector10

Code
bop_c6_m %>%
  left_join(sector10, by = "sector10") %>%
  group_by(sector10, Sector10) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
sector10 Sector10 Nobs
S1 Total economy 5241491
S121 Central Bank 872499
S12T Monetary Financial Institutions (MFI) other than central bank 855884
S122 Deposit-taking corporations except the central bank 854512
S123 Money market funds 850314
S13 General Government 842096
S1P Other sectors than MFIs and general government 838018
S12M Financial corporations other than MFIs 41926
S1V Non-financial corporations, households and non-profit institutions serving households 37926

sectpart

Code
bop_c6_m %>%
  left_join(sectpart, by = "sectpart") %>%
  group_by(sectpart, Sectpart) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
sectpart Sectpart Nobs
S1 Total economy 9485260
S121 Central Bank 169670
S122 Deposit-taking corporations except the central bank 158235
S12T Monetary Financial Institutions (MFI) other than central bank 144316
S13 General Government 144316
S1P Other sectors than MFIs and general government 144316
S123 Money market funds 144312
S1N Not sectorised 14362
S12K Monetary financial institutions (MFI) 13847
S1V Non-financial corporations, households and non-profit institutions serving households 10042
S12M Financial corporations other than MFIs 5990

stk_flow

Code
bop_c6_m %>%
  left_join(stk_flow, by = "stk_flow") %>%
  group_by(stk_flow, Stk_flow) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
stk_flow Stk_flow Nobs
ASS Assets 3170740
CRE Credit 1753412
DEB Debit 1404923
BAL Balance 1402681
NET Net 1390132
LIAB Liabilities 1312778

partner

Code
bop_c6_m %>%
  left_join(partner, by = "partner") %>%
  group_by(partner, Partner) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
partner Partner Nobs
WRL_REST Rest of the world 3115272
EXT_EA19 Extra-euro area - 19 countries (from 2015) 1565520
EA19 Euro area - 19 countries (2015-2022) 1565400
EA20 Euro area – 20 countries (from 2023) 1213122
EXT_EA20 Extra-euro area - 20 countries (from 2023) 1213122
EXT_EU28 Extra-EU28 (2013-2020) 448723
EU28 European Union - 28 countries (2013-2020) 448467
EXT_EU27_2020 Extra-EU27 (from 2020) 426632
EU27_2020 European Union - 27 countries (from 2020) 426436
IMF International Monetary Fund 11972

geo

Code
bop_c6_m %>%
  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 .}

time

Code
bop_c6_m %>%
  group_by(time) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(time)) %>%
  print_table_conditional()

Germany, France, Italy

CA

Code
bop_c6_m %>%
  filter(geo %in% c("DE", "FR", "IT"),
         stk_flow == "BAL",
         currency == "MIO_EUR",
         partner == "WRL_REST",
         bop_item == "CA") %>%
  month_to_date %>%
  left_join(geo, by = "geo") %>%
  left_join(B1GQ, by = c("geo", "date")) %>%
  group_by(Geo) %>%
  arrange(date) %>%
  mutate(B1GQ_i = spline(x = date, y = B1GQ, xout = date)$y,
         values = 3*values / B1GQ_i) %>%
  ggplot + geom_line(aes(x = date, y = values, color = Geo)) +
  scale_color_manual(values = c("#002395", "#000000", "#009246")) +
  theme_minimal()  +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2020, 5), "-01-01")),
               labels = date_format("%y")) +
  geom_image(data = . %>%
               filter(date == as.Date("2008-01-01")) %>%
               mutate(image = paste0("../../icon/flag/", str_to_lower(Geo), ".png")),
             aes(x = date, y = values, image = image), asp = 1.5) +
  theme(legend.position = "none") +
  xlab("") + ylab("") +
  scale_y_continuous(breaks = 0.01*seq(-30, 30, 1),
                labels = percent_format(a = 1)) + 
  geom_hline(yintercept = 0, linetype = "dashed",  color = "black")

KA

Code
bop_c6_m %>%
  filter(geo %in% c("DE", "FR", "IT"),
         stk_flow == "BAL",
         currency == "MIO_EUR",
         partner == "WRL_REST",
         bop_item == "KA") %>%
  month_to_date %>%
  left_join(geo, by = "geo") %>%
  left_join(B1GQ, by = c("geo", "date")) %>%
  group_by(Geo) %>%
  arrange(date) %>%
  mutate(B1GQ_i = spline(x = date, y = B1GQ, xout = date)$y,
         values = 3*values / B1GQ_i) %>%
  ggplot + geom_line(aes(x = date, y = values, color = Geo)) +
  scale_color_manual(values = c("#002395", "#000000", "#009246")) +
  theme_minimal()  +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2020, 5), "-01-01")),
               labels = date_format("%y")) +
  geom_image(data = . %>%
               filter(date == as.Date("2008-01-01")) %>%
               mutate(image = paste0("../../icon/flag/", str_to_lower(Geo), ".png")),
             aes(x = date, y = values, image = image), asp = 1.5) +
  theme(legend.position = "none") +
  xlab("") + ylab("") +
  scale_y_continuous(breaks = 0.01*seq(-30, 30, 1),
                labels = percent_format(a = 1)) + 
  geom_hline(yintercept = 0, linetype = "dashed",  color = "black")

By Destination: Europe, ex-Europe

France

Code
bop_c6_m %>%
  filter(geo == "FR",
         stk_flow == "BAL",
         time == "2021M04",
         currency == "MIO_EUR",
         partner %in% c("EA19", "EXT_EA19", "WRL_REST")) %>%
  left_join(bop_item, by = "bop_item") %>%
  select(bop_item, Bop_item, everything()) %>%
  select_if(~n_distinct(.) > 1) %>%
  spread(partner, values) %>%
  arrange(sector10) %>%
  print_table_conditional()
bop_item Bop_item sector10 EA19 EXT_EA19 WRL_REST
CA Current account S1 NA NA -478
CKA Current plus capital account (balance = Net lending (+) / net borrowing (-)) S1 NA NA 120
D1 Primary income: Compensation of employees S1 841 1293 2129
D41__O__FLA Primary income: Other Investment, interest S1 63 617 845
D41__P__F3 Primary income: Portfolio Investment, debt securities, interest S1 NA NA -446
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S1 NA NA 2035
D4O Primary income: Other primary income S1 -4 -24 1
D4P__D__F Primary income: Investment income; Direct investment S1 2873 3783 4470
D4P__F Primary income: Investment income S1 NA NA 3367
D4P__O__F Primary income: Investment income; Other investment S1 23 576 765
D4P__P__F Primary income: Investment income; Portfolio investment S1 NA NA -1943
D4Q__D__FL Primary income: Direct Investment, debt instruments S1 -46 113 79
D4S__D__F5 Primary income: Direct Investment income attributable to equity and investment fund shareholders S1 2919 3670 4391
D4S__P__F5 Primary income: Portfolio Investment income on equity and investment fund shares S1 NA NA -1498
G Goods S1 -4136 -453 -4645
GS Goods and services S1 -4629 1827 -2958
IN1 Primary income S1 NA NA 5497
IN2 Secondary income S1 -187 -2227 -3019
KA Capital account S1 -5 816 598
S Services S1 -493 2280 1687
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S122 0 0 269
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S123 0 0 0
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S12T 0 0 269
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S13 0 0 16
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S1P 703 771 1749

Germany

Code
bop_c6_m %>%
  filter(geo == "DE",
         stk_flow == "BAL",
         time == "2021M04",
         currency == "MIO_EUR",
         partner %in% c("EA19", "EXT_EA19", "WRL_REST")) %>%
  left_join(bop_item, by = "bop_item") %>%
  select(bop_item, Bop_item, everything()) %>%
  select_if(~n_distinct(.) > 1) %>%
  spread(partner, values) %>%
  arrange(sector10) %>%
  print_table_conditional()
bop_item Bop_item sector10 EA19 EXT_EA19 WRL_REST
CA Current account S1 NA NA 23130
CKA Current plus capital account (balance = Net lending (+) / net borrowing (-)) S1 NA NA 22203
D1 Primary income: Compensation of employees S1 274 -132 408
D41__O__FLA Primary income: Other Investment, interest S1 432 446 1081
D41__P__F3 Primary income: Portfolio Investment, debt securities, interest S1 NA NA 1784
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S1 NA NA 3145
D4O Primary income: Other primary income S1 0 -325 -438
D4P__D__F Primary income: Investment income; Direct investment S1 2775 4044 6132
D4P__F Primary income: Investment income S1 NA NA 7422
D4P__O__F Primary income: Investment income; Other investment S1 459 393 1042
D4P__P__F Primary income: Investment income; Portfolio investment S1 NA NA 216
D4Q__D__FL Primary income: Direct Investment, debt instruments S1 -413 -273 -769
D4S__D__F5 Primary income: Direct Investment income attributable to equity and investment fund shareholders S1 3188 4317 6901
D4S__P__F5 Primary income: Portfolio Investment income on equity and investment fund shares S1 NA NA -1567
G Goods S1 6893 8972 16210
GS Goods and services S1 NA NA 19542
IN1 Primary income S1 NA NA 7393
IN2 Secondary income S1 8 -3710 -3804
KA Capital account S1 -995 295 -927
S Services S1 NA NA 3332
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S122 -180 -409 -243
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S123 0 0 0
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S12T -180 -409 -243
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S13 0 0 0
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S1P 2519 1756 3387

By Destination: Europe, ex-Europe

France

Code
bop_c6_m %>%
  filter(geo == "FR",
         stk_flow == "BAL",
         time == "2021M04",
         currency == "MIO_EUR",
         partner %in% c("EA19", "EXT_EA19", "WRL_REST")) %>%
  left_join(bop_item, by = "bop_item") %>%
  select(bop_item, Bop_item, everything()) %>%
  select_if(~n_distinct(.) > 1) %>%
  spread(partner, values) %>%
  arrange(sector10) %>%
  print_table_conditional()
bop_item Bop_item sector10 EA19 EXT_EA19 WRL_REST
CA Current account S1 NA NA -478
CKA Current plus capital account (balance = Net lending (+) / net borrowing (-)) S1 NA NA 120
D1 Primary income: Compensation of employees S1 841 1293 2129
D41__O__FLA Primary income: Other Investment, interest S1 63 617 845
D41__P__F3 Primary income: Portfolio Investment, debt securities, interest S1 NA NA -446
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S1 NA NA 2035
D4O Primary income: Other primary income S1 -4 -24 1
D4P__D__F Primary income: Investment income; Direct investment S1 2873 3783 4470
D4P__F Primary income: Investment income S1 NA NA 3367
D4P__O__F Primary income: Investment income; Other investment S1 23 576 765
D4P__P__F Primary income: Investment income; Portfolio investment S1 NA NA -1943
D4Q__D__FL Primary income: Direct Investment, debt instruments S1 -46 113 79
D4S__D__F5 Primary income: Direct Investment income attributable to equity and investment fund shareholders S1 2919 3670 4391
D4S__P__F5 Primary income: Portfolio Investment income on equity and investment fund shares S1 NA NA -1498
G Goods S1 -4136 -453 -4645
GS Goods and services S1 -4629 1827 -2958
IN1 Primary income S1 NA NA 5497
IN2 Secondary income S1 -187 -2227 -3019
KA Capital account S1 -5 816 598
S Services S1 -493 2280 1687
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S122 0 0 269
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S123 0 0 0
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S12T 0 0 269
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S13 0 0 16
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S1P 703 771 1749

Germany

Code
bop_c6_m %>%
  filter(geo == "DE",
         stk_flow == "BAL",
         time == "2021M04",
         currency == "MIO_EUR",
         partner %in% c("EA19", "EXT_EA19", "WRL_REST")) %>%
  left_join(bop_item, by = "bop_item") %>%
  select(bop_item, Bop_item, everything()) %>%
  select_if(~n_distinct(.) > 1) %>%
  spread(partner, values) %>%
  arrange(sector10) %>%
  print_table_conditional()
bop_item Bop_item sector10 EA19 EXT_EA19 WRL_REST
CA Current account S1 NA NA 23130
CKA Current plus capital account (balance = Net lending (+) / net borrowing (-)) S1 NA NA 22203
D1 Primary income: Compensation of employees S1 274 -132 408
D41__O__FLA Primary income: Other Investment, interest S1 432 446 1081
D41__P__F3 Primary income: Portfolio Investment, debt securities, interest S1 NA NA 1784
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S1 NA NA 3145
D4O Primary income: Other primary income S1 0 -325 -438
D4P__D__F Primary income: Investment income; Direct investment S1 2775 4044 6132
D4P__F Primary income: Investment income S1 NA NA 7422
D4P__O__F Primary income: Investment income; Other investment S1 459 393 1042
D4P__P__F Primary income: Investment income; Portfolio investment S1 NA NA 216
D4Q__D__FL Primary income: Direct Investment, debt instruments S1 -413 -273 -769
D4S__D__F5 Primary income: Direct Investment income attributable to equity and investment fund shareholders S1 3188 4317 6901
D4S__P__F5 Primary income: Portfolio Investment income on equity and investment fund shares S1 NA NA -1567
G Goods S1 6893 8972 16210
GS Goods and services S1 NA NA 19542
IN1 Primary income S1 NA NA 7393
IN2 Secondary income S1 8 -3710 -3804
KA Capital account S1 -995 295 -927
S Services S1 NA NA 3332
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S122 -180 -409 -243
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S123 0 0 0
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S12T -180 -409 -243
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S13 0 0 0
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S1P 2519 1756 3387