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

Data - Eurostat

Info

source dataset .html .RData
eurostat bop_c6_m 2025-02-01 2025-05-18

Data on europe

source dataset .html .RData
eurostat bop_gdp6_q 2025-02-01 2025-05-18
eurostat nama_10_a10 2025-02-01 2025-05-18
eurostat nama_10_a10_e 2025-02-01 2025-05-18
eurostat nama_10_gdp 2025-02-01 2025-05-18
eurostat nama_10_lp_ulc 2025-02-01 2025-05-18
eurostat namq_10_a10 2025-03-04 2025-05-18
eurostat namq_10_a10_e 2025-03-13 2025-05-18
eurostat namq_10_gdp 2025-02-04 2025-05-18
eurostat namq_10_lp_ulc 2025-02-01 2025-05-18
eurostat namq_10_pc 2025-02-01 2025-05-18
eurostat nasa_10_nf_tr 2025-04-23 2025-05-18
eurostat nasq_10_nf_tr 2025-02-12 2025-05-18
eurostat tipsii40 2025-01-26 2025-05-18

LAST_COMPILE

LAST_COMPILE
2025-05-18

Last

Code
bop_c6_m %>%
  group_by(time) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(time)) %>%
  head(1) %>%
  print_table_conditional()
time Nobs
2025M02 33903

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 5380968
S121 Central Bank 895841
S12T Monetary Financial Institutions (MFI) other than central bank 881558
S122 Deposit-taking corporations except the central bank 880186
S123 Money market funds 875988
S13 General Government 867770
S1P Other sectors than MFIs and general government 863692
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 9746395
S121 Central Bank 175078
S122 Deposit-taking corporations except the central bank 163300
S12T Monetary Financial Institutions (MFI) other than central bank 149038
S13 General Government 149038
S1P Other sectors than MFIs and general government 149038
S123 Money market funds 149034
S1N Not sectorised 14712
S12K Monetary financial institutions (MFI) 14190
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 3265917
CRE Credit 1799762
DEB Debit 1442277
BAL Balance 1439939
NET Net 1428765
LIAB Liabilities 1349195

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 3200973
EXT_EA19 Extra-euro area - 19 countries (from 2015) 1565816
EA19 Euro area - 19 countries (2015-2022) 1565696
EA20 Euro area – 20 countries (from 2023) 1302898
EXT_EA20 Extra-euro area - 20 countries (from 2023) 1302898
EXT_EU28 Extra-EU28 (2013-2020) 448723
EU28 European Union - 28 countries (2013-2020) 448467
EXT_EU27_2020 Extra-EU27 (from 2020) 439136
EU27_2020 European Union - 27 countries (from 2020) 438940
IMF International Monetary Fund 12308

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 23134
CKA Current plus capital account (balance = Net lending (+) / net borrowing (-)) S1 NA NA 22206
D1 Primary income: Compensation of employees S1 274 -132 407
D41__O__FLA Primary income: Other Investment, interest S1 432 446 1085
D41__P__F3 Primary income: Portfolio Investment, debt securities, interest S1 NA NA 1780
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S1 NA NA 3428
D4O Primary income: Other primary income S1 0 -325 -438
D4P__D__F Primary income: Investment income; Direct investment S1 2775 4044 6414
D4P__F Primary income: Investment income S1 NA NA 7720
D4P__O__F Primary income: Investment income; Other investment S1 459 393 1047
D4P__P__F Primary income: Investment income; Portfolio investment S1 NA NA 228
D4Q__D__FL Primary income: Direct Investment, debt instruments S1 -413 -273 -774
D4S__D__F5 Primary income: Direct Investment income attributable to equity and investment fund shareholders S1 3188 4317 7187
D4S__P__F5 Primary income: Portfolio Investment income on equity and investment fund shares S1 NA NA -1552
G Goods S1 6893 8972 15750
GS Goods and services S1 NA NA 19243
IN1 Primary income S1 NA NA 7690
IN2 Secondary income S1 8 -3710 -3800
KA Capital account S1 -995 295 -927
S Services S1 NA NA 3494
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S122 -180 -409 -197
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 -197
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 3625

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 23134
CKA Current plus capital account (balance = Net lending (+) / net borrowing (-)) S1 NA NA 22206
D1 Primary income: Compensation of employees S1 274 -132 407
D41__O__FLA Primary income: Other Investment, interest S1 432 446 1085
D41__P__F3 Primary income: Portfolio Investment, debt securities, interest S1 NA NA 1780
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S1 NA NA 3428
D4O Primary income: Other primary income S1 0 -325 -438
D4P__D__F Primary income: Investment income; Direct investment S1 2775 4044 6414
D4P__F Primary income: Investment income S1 NA NA 7720
D4P__O__F Primary income: Investment income; Other investment S1 459 393 1047
D4P__P__F Primary income: Investment income; Portfolio investment S1 NA NA 228
D4Q__D__FL Primary income: Direct Investment, debt instruments S1 -413 -273 -774
D4S__D__F5 Primary income: Direct Investment income attributable to equity and investment fund shareholders S1 3188 4317 7187
D4S__P__F5 Primary income: Portfolio Investment income on equity and investment fund shares S1 NA NA -1552
G Goods S1 6893 8972 15750
GS Goods and services S1 NA NA 19243
IN1 Primary income S1 NA NA 7690
IN2 Secondary income S1 8 -3710 -3800
KA Capital account S1 -995 295 -927
S Services S1 NA NA 3494
D43S__D__F5 Primary income: Reinvested earnings on foreign direct investment (including investment funds) S122 -180 -409 -197
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 -197
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 3625