library(here)
source(here("R", "packages.R"))

opts_chunk$set(
  echo = FALSE, 
  warning = FALSE, 
  message = FALSE)

# ERC data on country participation (H2020 only)
participation <- 
  here("data", 
  "erc_country_stats.rds") %>%
  read_rds() %>%
  filter(call_year > 2013)

Summary

participation %>% 
  filter(projects == "evaluated") %>%
  group_by(iso2c) %>%
  summarise(n = sum(n)) %>%
  ungroup() %>%
  arrange(n) %>%
  mutate(cum_sum = cumsum(n)) %>%
  print(n = 41)

participation %>% 
  filter(projects == "granted") %>%
  group_by(iso2c) %>%
  summarise(n = sum(n)) %>%
  ungroup() %>%
  arrange(n) %>%
  mutate(cum_sum = cumsum(n)) %>%
  print(n = 41)

participation %>% 
  filter(projects == "evaluated",
         research_domain == "SH") %>%
  group_by(iso2c) %>%
  summarise(n = sum(n)) %>%
  ungroup() %>%
  arrange(n) %>%
  mutate(cum_sum = cumsum(n)) %>%
  print(n = 41)

participation %>% 
  filter(projects == "granted",
         research_domain == "SH") %>%
  group_by(iso2c) %>%
  summarise(n = sum(n)) %>%
  ungroup() %>%
  arrange(n) %>%
  mutate(cum_sum = cumsum(n)) %>%
  print(n = 41)

Data and conventions

Figures from ERC website. World Bank Open Data provides complementary country indicators such as population, GDP, and Gross Expenditure on R&D (GERD). Country codes are provided by {countrycode}.

Proposals correspond to evaluated grant applications and projects correspond to funded proposals.

Overview {.tabset .tabset-fade .tabset-pills}

The number of proposals by country ranges from only a few (e.g. in Moldova, Albania, Armenia, or Tunisia) to several thousands (e.g. in the UK, Germany, France, or Italy). Out of the 41 participating countries, 9 have not been awarded any project.

Overall, the UK has been the most active country. To date, it accounts for 17.2% of the proposals and 18.4% of the projects. Germany and France complete the podium.

On the whole, the distribution of the number of proposals by domain is comparable to that of all domains. The UK has been noticeably active in SH where it submitted more than double the number of proposals than the second most active country. In total, in SH, the UK submitted 21.9% of the proposals and was awarded 26.4% of the projects.

All

source(here("R", "overview.R"))
participation %>%
  plot_participation()

LS

participation %>%
  filter(research_domain == "LS") %>%
  plot_participation(title = "Country Participation in LS")

PE

participation %>%
  filter(research_domain == "PE") %>%
  plot_participation(title = "Country Participation in PE")

SH

participation %>%
  filter(research_domain == "SH") %>%
  plot_participation(title = "Country Participation in SH")

Rankings of top participating countries {.tabset .tabset-fade .tabset-pills}

Comparison of the rankings by numbers of proposals and projects reveals consistent drops for Spain and Italy. By contrast, Germany, Israel, and Switzerland typically show better rankings for projects than for proposals.

All

source(here("R", "rankings.R"))
participation %>% 
  get_rankings() %>%
  plot_rankings()

LS

participation %>%
  filter(research_domain == "LS") %>%
  get_rankings() %>%
  plot_rankings(title = "Ranking of top-10 participating countries in LS")

PE

participation %>%
  filter(research_domain == "PE") %>%
  get_rankings() %>%
  plot_rankings(title = "Ranking of top-10 participating countries in PE")

SH

participation %>%
  filter(research_domain == "SH") %>%
  get_rankings() %>%
  plot_rankings(title = "Ranking of top-10 participating countries in SH")

Participation, GDP, and GERD {.tabset .tabset-fade .tabset-pills}

The observed inequality in country participation is largely mirrored in countries' GDP and GERD levels. That applies for both EU28 and non-EU28 participants.

Participation

source(here("R", "indicators.R"))

summary_stats <- participation %>%
  group_by(iso2c, projects) %>%
  summarise(n = sum(n, na.rm = TRUE)) %>%
  pivot_wider(names_from = projects, values_from = n) %>%
  mutate(eu28 = countrycode(iso2c, "iso2c", "eu28", nomatch = "Non-EU"))

summary_stats %>%
  select(x = evaluated, y = granted, iso2c, eu28) %>%
  filter(y > 1) %>%
  plot_indicators("Evaluated Projects", 
                  caption = "Source: ERC website")

GDP

summary_stats <- summary_stats %>%
  left_join(get_indicators(pull(summary_stats, iso2c)), by = "iso2c")

summary_stats %>%
  select(x = gdp, y = granted, iso2c, eu28) %>%
  mutate(x = x * 1e-9) %>%
  filter(y > 1) %>%
  plot_indicators("Annual GDP ($bn)")

GERD

summary_stats %>%
  select(x = gerd, y = granted, iso2c, eu28) %>%
  mutate(x = x * 1e-6) %>%
  filter(y > 1) %>%
  plot_indicators("Annual GERD ($m)")

Activity and success

The activity index of a country is the proportion of proposals of the country in a domain divided by the average proportion of proposals of other countries in that same domain.

The success index of a country is the success rate of the country in a domain divided by the average success rate of other countries in that same domain.

Figures by domain

Comparison of the activity and success indexes of the 10 top participating countries among themselves provides a number of interesting individual observations:

source(here("R", "indices.R"))
countries <- participation %>%
    filter(projects == "evaluated") %>%
    group_by(iso2c) %>%
    summarise(n = sum(n)) %>%
    ungroup() %>%
    top_n(10, n) %>%
    pull(iso2c)

indices <- get_indices(participation, 
                       research_domain, 
                       countries)
plot_indices(indices,
             research_domain,
             title = "Activity and Success by Domain",
             subtitle = "Among the 10 Top Participating Countries")

Figures by panel {.tabset .tabset-fade .tabset-pills}

Among the 10 top participating countries:

LS

indices <- participation %>%
  filter(research_domain == "LS") %>%
  get_indices(research_panel,
              countries)

plot_indices(indices,
             research_panel,
             title = "Activity and Success in LS, by Panel",
             subtitle = "Among the 10 Top Participating Countries",
             nc = 4)

PE

indices <- participation %>%
  filter(research_domain == "PE") %>%
  get_indices(research_panel,
              countries)

plot_indices(indices,
             research_panel,
             title = "Activity and Success in PE, by Panel",
             subtitle = "Among the 10 Top Participating Countries",
             nc = 4)

SH

indices <- participation %>%
  filter(research_domain == "SH") %>%
  get_indices(research_panel,
              countries)

plot_indices(indices,
             research_panel,
             title = "Activity and Success in SH, by Panel",
             subtitle = "Among the 10 Top Participating Countries",
             nc = 4)

Figures by domain for mid-range participating countries

countries <- participation %>%
    filter(projects == "evaluated") %>%
    group_by(iso2c) %>%
    summarise(n = sum(n)) %>%
    ungroup() %>%
    top_n(20, n) %>%
    arrange(n) %>%
    pull(iso2c) %>%
  head(10)

indices <- get_indices(participation, 
                       research_domain, 
                       countries)
plot_indices(indices,
             research_domain,
             title = "Activity and Success by Domain",
             subtitle = "Among the 11-20 Top Participating Countries")

See also



zambujo/ercstats documentation built on Feb. 12, 2021, 2:12 p.m.