Process and merge data

Author

Suparna Chaudhry and Andrew Heiss

Date

February 2, 2023

Code
library(tidyverse)
library(targets)
library(DT)
library(kableExtra)
library(naniar)

tar_config_set(store = here::here('_targets'),
               script = here::here('_targets.R'))

# Generated via random.org
set.seed(376)

# Load targets stuff
invisible(list2env(tar_read(graphic_functions), .GlobalEnv))
invisible(list2env(tar_read(misc_funs), .GlobalEnv))

# Background stuff
tar_load(c(democracies, skeleton))

# Aid stuff
tar_load(c(aid_donors, aid_recipients, aid_purposes, aiddata_final, 
           usaid_clean, donor_level_data))

# NGO laws stuff
tar_load(c(dcjw_clean, chaudhry_raw, chaudhry_clean))

# V-Dem stuff
tar_load(c(vdem_clean, autocracies))

# Other data
tar_load(c(wdi_clean, un_pop, un_gdp, ucdp_prio_clean, disasters_summarized))

# Final data
tar_load(c(country_aid, country_aid_complete, 
           country_aid_final, country_aid_no_lags))

Create country-year skeleton

We use Gleditsch-Ward country codes to identify each country across the different datasets we merge.

We omit a bunch of things though:

  • We omit microstates

  • Because the World Bank doesn’t include it in the WDI, we omit Taiwan (713). We also omit East Germany (265) and South Yemen (680)

  • We only use the 163 countries in Suparna’s anti-NGO law data

  • Following Finkel, Pérez-Liñán, and Seligson (2007) (p. 414), we exclude long-term consolidated democracies from our analysis. These are classified by the World Bank as high income; they score below 3 on Freedom House’s Scale, receive no aid from USAID, and are not newly independent states:

    Code
    democracies %>% 
      pull(country_name) %>% 
      matrix_from_vector(ncol = 5) %>% 
      kbl() %>% 
      kable_styling(bootstrap_options = c("condensed", "striped"), 
                    full_width = FALSE)
    Australia Canada Greece Luxembourg Spain
    Austria Denmark Iceland Malta Sweden
    Bahamas Finland Ireland Netherlands Switzerland
    Barbados France Italy New Zealand United Kingdom
    Belgium Germany Japan Norway United States of America

To get consistency in country codes, we do this:

  • When converting GW codes to COW codes, following Gleditsch and Ward, we treat post-2006 Serbia as 345 (a continuation of Serbia & Montenegro). And we also treat Serbia as a continuation of Yugoslavia with 345 (following V-Dem, which does that too).
  • In both COW and GW codes, modern Vietnam is 816, but countrycode() thinks the COW code is 817, which is old South Vietnam (see issue), so we use custom_match to force 816 to recode to 816.
  • Also, following V-Dem, we treat Czechoslovakia (GW/COW 315) and Czech Republic (GW/COW 316) as the same continuous country (V-Dem has both use ID 157).

Thus, here’s our actual panel skeleton:

We have 142 countries in our final data, spanning 24 possible years. Here’s a lookup table of all the countries included:

Code
skeleton$skeleton_lookup %>% 
  select(-years_included) %>% 
  datatable(class = "compact")

Foreign aid

OECD and AidData

The OECD collects detailed data on all foreign aid flows (ODA) from OECD member countries (and some non-member countries), multilateral organizations, and the Bill and Melinda Gates Foundation (for some reason they’re the only nonprofit donor) to all DAC-eligible countries (and some non non-DAC-eligible countries).

The OECD tracks all this in a centralized Creditor Reporting System database and provides a nice front end for it at OECD.Stat with an open (but inscrutable) API (raw CRS data is also available). There are a set of pre-built queries with information about ODA flows by donor, recipient, and sector (purpose), but the pre-built data sources do not include all dimensions of the data. For example, Table DAC2a includes columns for donor, recipient, year, and total ODA (e.g. the US gave $X to Nigeria in 2008) , but does not indicate the purpose/sector for the ODA. Table DAC5 includes columns for the donor, sector, year, and total ODA (e.g. the US gave $X for education in 2008), but does not include recipient information.

Instead of using these pre-built queries or attempting to manipulate their parameters, it’s possible to use the OECD’s QWIDS query builder to create a custom download of data. However, it is slow and clunky and requires significant munging and filtering after exporting.

The solution to all of this is to use data from AidData, which imports raw data from the OECD, cleans it, verifies it, and makes it freely available on GitHub.

AidData offers multiple versions of the data, including a full release, a thin release, aggregated donor/recipient/year data, and aggregated donor/recipient/year/purpose data. For the purposes of this study, all we care about are ODA flows by donor, recipient, year, and purpose, which is one of the ready-made datasets.

Notably, this aggregated data shows total aid commitments, not aid disbursements. Both types of ODA information are available from the OECD and it’s possible to get them using OECD’s raw data. However, AidData notes that disbursement data is sticky and slow—projects take a long time to fulfill and actual inflows of aid in a year can be tied to commitments made years before. Because we’re interested in donor reactions to restrictions on NGOs, any reaction would be visible in the decision to commit money to aid, not in the ultimate disbursement of aid, which is most likely already legally obligated and allocated to the country regardless of restrictions.

So, we look at ODA commitments.

Code
aiddata_final %>% glimpse()
## List of 2
##  $ aiddata_final    : tibble [624,258 × 15] (S3: tbl_df/tbl/data.frame)
##   ..$ donor                  : chr [1:624258] "Canada" "Italy" "Norway" "Sweden" ...
##   ..$ donor_type             : chr [1:624258] "Country" "Country" "Country" "Country" ...
##   ..$ donor_type_collapsed   : chr [1:624258] "Country" "Country" "Country" "Country" ...
##   ..$ donor_gwcode           : num [1:624258] 20 325 385 380 380 380 305 305 20 20 ...
##   ..$ donor_iso3             : chr [1:624258] "CAN" "ITA" "NOR" "SWE" ...
##   ..$ year                   : num [1:624258] 1973 1973 1973 1973 1973 ...
##   ..$ gwcode                 : num [1:624258] 40 40 40 40 40 40 40 40 40 40 ...
##   ..$ iso3                   : chr [1:624258] "CUB" "CUB" "CUB" "CUB" ...
##   ..$ oda                    : num [1:624258] 868282 65097 3161808 39976725 6996366 ...
##   ..$ purpose_code_short     : num [1:624258] 998 111 321 111 321 530 311 321 311 430 ...
##   ..$ purpose_sector         : chr [1:624258] "Non Sector" "Social" "Prod" "Social" ...
##   ..$ purpose_category       : chr [1:624258] "Other" "Education" "Industry" "Education" ...
##   ..$ purpose_contentiousness: chr [1:624258] "Low" "Low" "Low" "Low" ...
##   ..$ coalesced_purpose_code : num [1:624258] 99810 11120 32120 11120 32105 ...
##   ..$ coalesced_purpose_name : chr [1:624258] "Sectors not specified" "Education facilities and training" "Industrial development" "Education facilities and training" ...
##  $ ever_dac_eligible: num [1:133] 700 540 771 434 760 439 516 811 482 581 ...
Code
aid_donors %>% datatable(class = c("compact"))
Code
select(aid_recipients, recipient) %>% datatable(class = c("compact"))
Code
arrange(aid_purposes, desc(n)) %>% datatable(class = c("compact"))

USAID

USAID provides the complete dataset for its Foreign Aid Explorer as a giant CSV file. The data includes both economic and military aid, but it’s easy to filter out the military aid. Here we only look at obligations, not disbursements, so that the data is comparable to the OECD data from AidData. The data we downloaded provides constant amounts in 2015 dollars; we rescale that to 2011 to match all other variables.

Code
usaid_clean %>% glimpse()
## Rows: 767,841
## Columns: 14
## $ gwcode                                 <dbl> 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 7…
## $ year                                   <dbl> 2006, 2005, 2006, 2004, 2006, 2006, 2004, 2005, 2006, 2003, 2003, 2005,…
## $ managing_agency_name                   <chr> "U.S. Agency for International Development", "U.S. Agency for Internati…
## $ managing_sub_agency_or_bureau_name     <chr> "Bureau for Asia", "Bureau for Asia", "Bureau for Asia", "Bureau for As…
## $ activity_name                          <chr> "Office Of Social Sector Dev. - Education", "Office Of Social Sector De…
## $ implementing_partner_category_name     <chr> "Government", "Government", "Government", "Government", "Government", "…
## $ implementing_partner_sub_category_name <chr> "Government - United States", "Government - United States", "Government…
## $ international_sector_code              <dbl> 112, 112, 112, 151, 151, 151, 152, 152, 152, 152, 152, 152, 152, 152, 1…
## $ oda_us_current                         <dbl> 37760, 8847, 186, 5538, 45453, -8150, 102594, 9575, -6908, 723, 4726, -…
## $ oda_us_2015                            <dbl> 47209, 11414, 233, 7363, 56828, -10189, 136412, 12354, -8637, 984, 6434…
## $ aid_deflator                           <dbl> 80.0, 77.5, 79.8, 75.2, 80.0, 80.0, 75.2, 77.5, 80.0, 73.5, 73.5, 77.5,…
## $ channel_ngo_us                         <lgl> FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, F…
## $ channel_ngo_int                        <lgl> FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, F…
## $ channel_ngo_dom                        <lgl> FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, F…

Here are the US government agencies giving out money:

Code
implementing_agencies <- usaid_clean %>%
  count(managing_agency_name, managing_sub_agency_or_bureau_name) %>%
  arrange(desc(n), managing_agency_name)

implementing_agencies %>% datatable()

The activities listed don’t follow any standard coding guidelines. There are tens of thousands of them. Here are the first 100, just for reference:

Code
activities <- usaid_clean %>%
  count(activity_name) %>%
  slice(1:100)

activities %>% datatable()

USAID distinguishes between domestic, foreign, and international NGOs, companies, multilateral organizations, etc. implementing partners (formerly called channels):

Code
channels <- usaid_clean %>%
  count(implementing_partner_category_name, implementing_partner_sub_category_name) %>%
  filter(!is.na(implementing_partner_category_name))

channels %>% datatable(options = list(pageLength = 20))

NGO regulations

Chaudhry laws

In 2013, Darin Christensen and Jeremy Weinstein collected detailed data on NGO regulations for their Journal of Democracy article, covering 98 countries.

Suparna Chaudhry expanded this data substantially (it now covers 163 countries and goes to 2013), so we use that.

Notes on year coverage

In our original paper from 2017, we used Suparna’s data and backfilled it to 1980, since going back in time is possible with the DCJW data—lots of the entries in DCJW include start dates of like 1950 or 1970. Accordingly, our analysis ranged from 1980-2013. However, not all of Suparna’s expanded countries went back in time that far, and she focused primarily on 1990+ changes. Additionally—and more importantly—the whole nature of foreign aid and civil society changed drastically after the Cold War. Civil society regulations weren’t really used as a political strategy until after 1990. We can confirm that by plotting V-Dem’s core civil society index:

Code
vdem_clean %>% 
  filter(year >= 1980) %>% 
  select(year, v2xcs_ccsi) %>% 
  group_by(year) %>% 
  summarize(avg_ccsi = mean(v2xcs_ccsi)) %>% 
  ggplot(aes(x = year, y = avg_ccsi)) +
  geom_line() +
  geom_vline(xintercept = 1990, color = "red") +
  labs(x = "Year", y = "Average Core Civil Society Index", 
       caption = "Source: V-Dem's v2xcs_ccsi") +
  theme_donors()

Something systematic happened to civil society regulations worldwide in 1990, and rather than try to model pre-Cold War regulations, which were connected to foreign aid in completely different ways than they were after the dissolution of the USSR, we limit our analysis to 1990+

We still collect as much pre-1990 data as possible for the sake of (1) lagging, so we can get lagged values from 1989 and 1988 when looking at lagged variables in 1990, and (2) robustness checks that we run using the 98 backfilled DCJW countries.

Index creation

We create several indexes for each of the categories of regulation, following Christensen and Weinstein’s classification:

  • entry (Q2b, Q2c, Q2d; 3 points maximum, actual max = 3 points maximum): barriers to entry
    • Q2c is reversed, so not being allowed to appeal registration status earns 1 point.
    • Q2a is omitted because it’s benign
  • funding (Q3b, Q3c, Q3d, Q3e, Q3f; 5 points maximum, actual max = 4.5): barriers to funding
    • Q3a is omitted because it’s benign
    • Scores that range between 0–2 are rescaled to 0–1 (so 1 becomes 0.5)
  • advocacy (Q4a, Q4c; 2 points maximum, actual max = 2): barriers to advocacy
    • Q4b is omitted because it’s not a law
    • Scores that range between 0–2 are rescaled to 0–1 (so 1 becomes 0.5)
  • barriers_total (10 points maximum, actual max = 8.5): sum of all three indexes

These indexes are also standardized by dividing by the maximum, yielding the following variables:

  • entry_std: 1 point maximum, actual max = 1
  • funding_std: 1 point maximum, actual max = 1
  • advocacy_std: 1 point maximum, actual max = 1
  • barriers_total_std: 3 points maximum, actual max = 2.5

Chaudhry 2020 data

The most recent version of Suparna’s data is already in nice clean panel form, so it’s super easy to get cleaned up.

Code
glimpse(chaudhry_clean)
## Rows: 3,967
## Columns: 22
## $ gwcode                         <dbl> 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 20, …
## $ year                           <dbl> 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2…
## $ advocacy                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ entry                          <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0…
## $ funding                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ entry_std                      <dbl> 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.…
## $ funding_std                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ advocacy_std                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ barriers_total                 <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0…
## $ barriers_total_std             <dbl> 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.…
## $ ngo_register                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ ngo_register_burden            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ ngo_register_appeal            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ ngo_barrier_foreign_funds      <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0…
## $ ngo_disclose_funds             <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0…
## $ ngo_foreign_fund_approval      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ ngo_foreign_fund_channel       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ ngo_foreign_fund_restrict      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ ngo_foreign_fund_prohibit      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ ngo_type_foreign_fund_prohibit <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ ngo_politics                   <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ ngo_politics_foreign_fund      <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…

DCJW data

For fun and robustness checks, we use DCJW’s non-panel data to generate a panel starting in 1980, since they have entries where laws start in the 1960s and 70s and other pre-1980 years.

Code
glimpse(dcjw_clean)
## Rows: 3,626
## Columns: 10
## $ gwcode             <dbl> 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2…
## $ year               <dbl> 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1…
## $ advocacy           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ entry              <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1…
## $ funding            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ entry_std          <dbl> 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, …
## $ funding_std        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ advocacy_std       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ barriers_total     <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1…
## $ barriers_total_std <dbl> 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, 0.333, …

All clean! Except not! NEVER MIND TO ALL THAT ↑

Suparna made updates to existing the DCJW countries too, like Honduras (gwcode 91), which has more correct values for q4a, for instance, which DCJW marks as 0, but is actually 1. So even though we can go back in time to 1980 with DCJW, it’s not comparable with Suparna’s expanded and more recent data.

Code
# Look at Honduras in 1990 in both datasets:
dcjw_clean %>% filter(year == 1990, gwcode == 91)
## # A tibble: 1 × 10
##   gwcode  year advocacy entry funding entry_std funding_std advocacy_std barriers_total barriers_total_std
##    <dbl> <dbl>    <dbl> <dbl>   <dbl>     <dbl>       <dbl>        <dbl>          <dbl>              <dbl>
## 1     91  1990        0     0       0         0           0            0              0                  0

chaudhry_clean %>% filter(year == 1990, gwcode == 91)
## # A tibble: 1 × 22
##   gwcode  year advocacy entry funding entry_std fundin…¹ advoc…² barri…³ barri…⁴ ngo_r…⁵ ngo_r…⁶ ngo_r…⁷ ngo_b…⁸ ngo_d…⁹
##    <dbl> <dbl>    <dbl> <dbl>   <dbl>     <dbl>    <dbl>   <dbl>   <dbl>   <dbl>   <dbl>   <dbl>   <dbl>   <dbl>   <dbl>
## 1     91  1990      0.5     0       0         0        0    0.25     0.5    0.25       0       0       0       0       0
## # … with 7 more variables: ngo_foreign_fund_approval <dbl>, ngo_foreign_fund_channel <dbl>,
## #   ngo_foreign_fund_restrict <dbl>, ngo_foreign_fund_prohibit <dbl>, ngo_type_foreign_fund_prohibit <dbl>,
## #   ngo_politics <dbl>, ngo_politics_foreign_fund <dbl>, and abbreviated variable names ¹​funding_std, ²​advocacy_std,
## #   ³​barriers_total, ⁴​barriers_total_std, ⁵​ngo_register, ⁶​ngo_register_burden, ⁷​ngo_register_appeal,
## #   ⁸​ngo_barrier_foreign_funds, ⁹​ngo_disclose_funds

So we live with just 1990+, even for the sake of lagging 🤷.

Except, we’re not quite done yet!

In Suparna’s clean data, due to post-Cold War chaos, Russia (365) is missing for 1990-1991 and Serbia/Serbia and Montenegro/Yugoslavia (345) is missing every thing pre-2006. DCJW don’t include any data for Serbia, so we’re out of luck there—we’re limited to Serbia itself and not past versions of it. DCJW do include data for Russia, though, so we use that in our clean final NGO laws data. Fortunately this is easy, since Russia’s values are all 0 for those two years:

Code
dcjw_clean %>% 
  filter(gwcode == 365, year %in% c(1990, 1991))
## # A tibble: 2 × 10
##   gwcode  year advocacy entry funding entry_std funding_std advocacy_std barriers_total barriers_total_std
##    <dbl> <dbl>    <dbl> <dbl>   <dbl>     <dbl>       <dbl>        <dbl>          <dbl>              <dbl>
## 1    365  1990        0     0       0         0           0            0              0                  0
## 2    365  1991        0     0       0         0           0            0              0                  0

Varieties of Democracy (V-Dem)

Regulatory environment

An alternative way of measuring civil society restrictions is to look at the overall civil society regulatory environment rather than specific laws, since de jure restrictions do not always map clearly into de facto restrictions (especially in dictatorships where the implementation of laws is more discretionary).

Andrew Heiss develops a new civil society regulatory environment index (CSRE) in his dissertation, which combines two civil society indexes from the Varieties of Democracy project (V-Dem): (1) civil society repression (v2csreprss) and (2) civil society entry and exit regulations (v2cseeorgs). The CSRE ranges from roughly −6 to 6 (though typically only from −4 to 4ish), and shows more variation over time since it ostensibly captures changes in the implementation of the regulatory environment rather than the presence or absence of legislation.

Additionally, since Andrew’s dissertation, the V-Dem project has created its own core civil society index (v2xcs_ccsi) (entry/exit (v2cseeorgs) + repression (v2csreprss) + participatory environment (v2csprtcpt)). We use that instead, since V-Dem rescales it to a 0-1 scale so it’s not weirdly distributed from like my additive two-factor CSRE index.

While the main focus of this paper is donor response to new legislation, we also look at donor response to changes in the overall civil society index as a robustness check. This also allows us to potentially include data from 1980–2018 (since Suparana’s law data ranges from 1990–2014).

Other variables

We also use a bunch of other V-Dem variables as confounders:

  • Civil society things
    • CSO entry and exit: v2cseeorgs
    • CSO repression: v2csreprss
    • CSO consultation: v2cscnsult
    • CSO participatory environment: v2csprtcpt
    • CSO women’s participation: v2csgender
    • CSO anti-system movements: v2csantimv
    • Core civil society index (entry/exit, repression, participatory env): v2xcs_ccsi
  • Human rights and politics
    • Polity scores: e_polity2 (only for reference with polyarchy; we don’t use these in models)
    • Electoral democracy index: v2x_polyarchy
    • Regimes of the world scores: v2x_regime_amb (only for determining average autocracy; we don’t use these in models)
    • Political corruption index: v2x_corr (less to more, 0-1) (public sector + executive + legislative + judicial corruption)
    • Rule of law index: v2x_rule
    • Civil liberties index: v2x_civlib
    • Physical violence index: v2x_clphy
    • Private civil liberties index: v2x_clpriv
    • Political civil liberties index: v2x_clpol (but not this because it includes v2cseeorgs and v2csreprss)
  • Economics and development
    • Educational equality: v2peedueq
    • Health equality: v2pehealth
    • Infant mortality rate: e_peinfmor
Code
glimpse(vdem_clean)
## Rows: 6,747
## Columns: 21
## $ year           <dbl> 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995,…
## $ v2cseeorgs     <dbl> 0.069, 0.069, 0.069, 0.069, 0.069, 0.069, 0.069, 0.069, 0.069, 0.187, 0.187, 0.187, 0.187, 0.18…
## $ v2csreprss     <dbl> -0.641, -0.641, -0.641, -0.641, -0.641, -0.641, -0.641, -0.641, -0.641, -0.641, -0.641, -0.625,…
## $ v2cscnsult     <dbl> 0.245, 0.245, 0.245, 0.245, 0.245, 0.245, 0.665, 0.665, 0.665, 0.659, 0.128, 0.128, 0.128, 0.12…
## $ v2csprtcpt     <dbl> -1.399, -1.399, -1.399, -1.399, -1.399, -0.693, -0.693, -0.693, -0.693, -0.693, -0.693, -0.693,…
## $ v2csgender     <dbl> -0.115, -0.115, -0.115, -0.115, -0.115, 0.453, 0.453, 0.453, 0.453, 0.453, 0.453, 0.453, 0.453,…
## $ v2csantimv     <dbl> -0.560, -0.560, -0.560, -0.871, -0.871, -0.871, -0.871, -0.871, -0.871, -0.879, -0.879, -0.879,…
## $ v2xcs_ccsi     <dbl> 0.352, 0.352, 0.352, 0.352, 0.352, 0.386, 0.386, 0.386, 0.386, 0.410, 0.410, 0.389, 0.389, 0.38…
## $ v2x_corr       <dbl> 0.828, 0.828, 0.791, 0.783, 0.783, 0.783, 0.783, 0.783, 0.783, 0.778, 0.778, 0.778, 0.778, 0.77…
## $ v2x_rule       <dbl> 0.262, 0.243, 0.316, 0.298, 0.298, 0.298, 0.298, 0.298, 0.333, 0.318, 0.361, 0.361, 0.361, 0.36…
## $ v2x_civlib     <dbl> 0.588, 0.572, 0.606, 0.606, 0.606, 0.606, 0.606, 0.594, 0.602, 0.622, 0.632, 0.605, 0.643, 0.64…
## $ v2x_clphy      <dbl> 0.417, 0.417, 0.417, 0.417, 0.417, 0.417, 0.417, 0.422, 0.422, 0.454, 0.454, 0.483, 0.483, 0.48…
## $ v2x_clpriv     <dbl> 0.701, 0.701, 0.701, 0.701, 0.701, 0.701, 0.701, 0.701, 0.701, 0.715, 0.715, 0.714, 0.762, 0.73…
## $ v2x_clpol      <dbl> 0.624, 0.634, 0.669, 0.669, 0.669, 0.669, 0.669, 0.670, 0.678, 0.665, 0.678, 0.657, 0.657, 0.68…
## $ e_polity2      <dbl> -3, -3, -3, -3, -3, -3, -3, -3, 0, 0, 0, 0, 0, 0, 4, 4, 4, 6, 6, 6, 8, 8, 8, 8, 8, 8, 8, 8, 8, …
## $ v2x_polyarchy  <dbl> 0.293, 0.312, 0.317, 0.342, 0.342, 0.342, 0.348, 0.341, 0.354, 0.370, 0.389, 0.435, 0.448, 0.43…
## $ v2x_regime_amb <dbl> 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 4, 3, 4, 5, 5, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6,…
## $ v2peedueq      <dbl> -1.026, -1.026, -1.026, -1.026, -1.026, -1.026, -1.026, -1.026, -1.026, -1.026, -1.026, -1.026,…
## $ v2pehealth     <dbl> -0.378, -0.378, -0.378, -0.378, -0.378, -0.378, -0.378, -0.378, -0.782, -0.782, -0.740, -0.740,…
## $ e_peinfmor     <dbl> 56.1, 53.7, 51.4, 49.2, 47.3, 45.5, 43.8, 42.1, 40.5, 38.8, 37.1, 35.4, 33.7, 32.0, 30.4, 28.8,…
## $ gwcode         <dbl> 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70, 70,…

Autocracies

We’re also interested in how these civil society dynamics work in autocracies in particular. We generate a crude list of autocracies based on average “Regimes of the World” scores (for ambiguous cases) from V-Dem. In that measure, 4 is the upper bound and 5 is the lower bound for electoral autocracy, so we use 4 as the cutoff. There are bound to be better ways, but this works for now.

Code
autocracies %>% filter(autocracy) %>% glimpse()
## Rows: 95
## Columns: 12
## $ gwcode         <dbl> 700, 339, 615, 540, 371, 373, 692, 771, 370, 760, 439, 516, 811, 471, 482, 710, 581, 484, 490, …
## $ cowcode        <dbl> 700, 339, 615, 540, 371, 373, 692, 771, 370, 760, 439, 516, 811, 471, 482, 710, 581, 484, 490, …
## $ country        <chr> "Afghanistan", "Albania", "Algeria", "Angola", "Armenia", "Azerbaijan", "Bahrain", "Bangladesh"…
## $ iso2           <chr> "AF", "AL", "DZ", "AO", "AM", "AZ", "BH", "BD", "BY", "BT", "BF", "BI", "KH", "CM", "CF", "CN",…
## $ iso3           <chr> "AFG", "ALB", "DZA", "AGO", "ARM", "AZE", "BHR", "BGD", "BLR", "BTN", "BFA", "BDI", "KHM", "CMR…
## $ un             <dbl> 4, 8, 12, 24, 51, 31, 48, 50, 112, 64, 854, 108, 116, 120, 140, 156, 174, 178, 180, 384, 192, 2…
## $ region         <chr> "South Asia", "Europe & Central Asia", "Middle East & North Africa", "Sub-Saharan Africa", "Eur…
## $ un_region      <chr> "Asia", "Europe", "Africa", "Africa", "Asia", "Asia", "Asia", "Asia", "Europe", "Asia", "Africa…
## $ un_subregion   <chr> "Southern Asia", "Southern Europe", "Northern Africa", "Sub-Saharan Africa", "Western Asia", "W…
## $ years_included <int> 39, 39, 39, 39, 28, 28, 39, 39, 28, 39, 39, 39, 39, 39, 39, 39, 39, 39, 39, 39, 39, 39, 39, 39,…
## $ avg_row        <dbl> 1.200, 3.675, 1.875, 0.825, 3.733, 2.900, 0.000, 3.500, 3.400, 2.075, 3.525, 1.550, 2.325, 2.92…
## $ autocracy      <lgl> TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE,…

World Bank development indicators

We don’t really use anything from the World Bank’s data except for population data for Kosovo.

Code
glimpse(wdi_clean)
## Rows: 5,538
## Columns: 6
## $ country    <chr> "Afghanistan", "Afghanistan", "Afghanistan", "Afghanistan", "Afghanistan", "Afghanistan", "Afghanis…
## $ gwcode     <dbl> 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700,…
## $ year       <int> 2009, 1996, 2008, 2012, 2011, 1991, 1992, 2010, 1995, 2007, 1980, 1981, 1983, 1984, 1985, 1986, 198…
## $ region     <chr> "South Asia", "South Asia", "South Asia", "South Asia", "South Asia", "South Asia", "South Asia", "…
## $ income     <chr> "Low income", "Low income", "Low income", "Low income", "Low income", "Low income", "Low income", "…
## $ population <dbl> 27385307, 17106595, 26427199, 30466479, 29249157, 10745167, 12057433, 28189672, 16418912, 25903301,…

UNData

The reason we don’t just use WDI data for GDP and % of GDP from trade is that the WDI data is incomplete, especially pre-1990. To get around that, we create our own GDP and trade measures using data directly from the UN (at UNData). They don’t have a neat API like the World Bank, so you have to go to their website and export the data manually.

We collect three variables: GDP at constant 2015 prices, GDP at current prices, and population.

Code
glimpse(un_pop)
## Rows: 10,022
## Columns: 3
## $ gwcode     <dbl> 516, 516, 516, 516, 516, 516, 516, 516, 516, 516, 516, 516, 516, 516, 516, 516, 516, 516, 516, 516,…
## $ year       <int> 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 196…
## $ population <dbl> 2308927, 2360442, 2406034, 2449089, 2492192, 2537150, 2584913, 2635622, 2688751, 2743202, 2797925, …

Dealing with the GDP data is a little trickier because it’s in 2015 dollars, while AidData is in 2011 dollars. To fix this, we create a GDP deflator and rebase the 2015 values to 2011 values.

Code
glimpse(un_gdp)
## Rows: 6,440
## Columns: 4
## $ gwcode           <int> 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700, 700…
## $ year             <dbl> 2018, 2017, 2016, 2015, 2014, 2013, 2012, 2011, 2010, 2009, 2008, 2007, 2006, 2005, 2004, 200…
## $ un_trade_pct_gdp <dbl> 0.510, 0.584, 0.543, 0.553, 0.509, 0.544, 0.552, 0.481, 0.537, 0.553, 0.636, 0.720, 0.944, 0.…
## $ un_gdp           <dbl> 2.50e+10, 2.54e+10, 2.37e+10, 2.29e+10, 2.33e+10, 2.26e+10, 2.13e+10, 1.92e+10, 1.76e+10, 1.7…

UCDP/PRIO Armed Conflict

The UCDP/PRIO Armed Conflict Dataset tracks a ton of conflict-releated data, including reasons for the conflict, parties in the conflict, intensity of the conflict, and deaths in the conflict. We’re only interested in whether a conflict happened in a given year (or in the past 5 years), so here we simply create an indicator variable for whether there was internal conflict in a country-year (conflict type = 3).

Code
glimpse(ucdp_prio_clean)
## Rows: 1,283
## Columns: 3
## $ gwcode            <int> 40, 40, 40, 40, 41, 41, 41, 42, 52, 70, 70, 90, 90, 90, 90, 90, 90, 90, 90, 90, 90, 90, 90, …
## $ year              <dbl> 1953, 1956, 1957, 1958, 1989, 1991, 2004, 1965, 1990, 1994, 1996, 1949, 1954, 1963, 1965, 19…
## $ internal_conflict <lgl> TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TR…

Natural disasters

Natural disaster data comes from the International Disaster Database (EM-DAT). The data includes the number of deaths, injuries, homeless displacements, and monetary losses (in 2000 dollars) for a huge number of natural and technological disasters (see EM-DAT’s full classification).

Natural disasters could matter for aid too, since donor countries might increase their aid to countries suffering more.

EM-DAT does not provide a single link to download their data. Instead, you have to create a query using their advanced search form. We downloaded data using the following query:

  • Select all countries from 1950–2021
  • Select all three disaster classification groups (natural, technological, complex)
  • Download Excel file and save in Data/raw_data/Disasters/
Code
glimpse(disasters_summarized)
## Rows: 3,259
## Columns: 9
## $ gwcode                     <dbl> 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40,…
## $ year                       <dbl> 1981, 1982, 1983, 1985, 1986, 1987, 1988, 1990, 1992, 1993, 1994, 1995, 1996, 1997,…
## $ natural_dis_deaths         <dbl> 0, 24, 15, 4, 0, 0, 23, 4, 0, 51, 14, 2, 3, 3, 6, 4, 2, 5, 3, 0, 4, 20, 2, 1, 7, 14…
## $ natural_dis_injured        <dbl> 0, 0, 39, 0, 0, 0, 12, 0, 40, 95, 0, 3, 0, 0, 0, 0, 0, 12, 0, 0, 5, 0, 8, 0, 19, 0,…
## $ natural_dis_affected       <dbl> 0, 105000, 164536, 479891, 7500, 0, 150000, 5000, 14956, 739038, 106338, 33340, 280…
## $ natural_dis_homeless       <dbl> 0, 75000, 0, 22000, 0, 0, 1500, 6000, 0, 32000, 42820, 0, 66681, 0, 0, 26923, 0, 0,…
## $ natural_dis_total_affected <dbl> 0, 180000, 164575, 501891, 7500, 0, 151512, 11000, 14996, 771133, 149158, 33343, 34…
## $ natural_dis_total_damage   <dbl> 0, 85000, 60000, 0, 0, 0, 0, 0, 2590, 1140000, 101968, 2000, 13000, 0, 2180000, 0, …
## $ natural_dis_count          <dbl> 1, 1, 1, 2, 2, 1, 3, 2, 2, 5, 2, 3, 3, 2, 2, 2, 2, 1, 3, 1, 3, 2, 2, 3, 5, 3, 1, 2,…

Clean combined data

With both donor- and country-level data, we have lots of different options for analysis. Since our hypotheses deal with questions of donor responses, the data we use to model donor responses uses donor-years as the unit of observation. Not all donors give money to the same countries, so this final data is not a complete panel (i.e. it does not include every combination of donors and years), which will pose some interesting methodological issues when modeling if we use donor-level data.

Inflation

USAID’s conversion to constant 2015 dollars doesn’t seem to take country differences into account—the deflator for each country in 2011 is essentially 96.65. When there are differences, it’s because of floating point issues (like, if there are tiny grants of $3, there aren’t enough decimal points to get the fraction to 96.65). So we just take the median value of the deflator for all countries and all grants and use that.

Missing data

The donor data is complete with no missing variables(!).

Code
gg_miss_var(donor_level_data, show_pct = TRUE) +
  theme_donors()
## Warning: The `guide` argument in `scale_*()` cannot be `FALSE`. This was deprecated in ggplot2 3.3.4.
## ℹ Please use "none" instead.
## ℹ The deprecated feature was likely used in the naniar package.
##   Please report the issue at <]8;;https://github.com/njtierney/naniar/issueshttps://github.com/njtierney/naniar/issues]8;;>.

The country-level panel data is relatively complete, with only a few variables suffering from missing data, mostly from the World Bank and V-Dem. There are a lot of NGO-related missing variables, but that’s because we don’t have data from 1980–1989 and 2015+

Code
gg_miss_var(country_aid, show_pct = TRUE)

Code
country_aid %>% 
  select(-starts_with("funding"), -starts_with("entry"), 
         -starts_with("advocacy"), -starts_with("barriers"),
         -starts_with("ngo_")) %>% 
  gg_miss_var(., show_pct = TRUE) +
  theme_donors()

Here’s how we address that:

  • We remove everything from Yugoslavia/Serbia and Montenegro (345) prior to 2006

  • Infant mortality e_peinfmor is missing from Kosovo (2008–2014), and the World Bank doesn’t have data for it, but Eurostat does in their demo_minfind indicator. Their data, however, is missing a couple years

    Code
    kosovo_infant_mort <- tibble(year = 2007:2019,
                                 e_peinfmor = c(11.1, 9.7, 9.9, 8.8, 13.1, 11.4, 
                                                NA, NA, 9.7, 8.5, 9.7, 10.6, 8.7))
    kosovo_infant_mort
    # A tibble: 13 × 2
        year e_peinfmor
       <int>      <dbl>
     1  2007       11.1
     2  2008        9.7
     3  2009        9.9
     4  2010        8.8
     5  2011       13.1
     6  2012       11.4
     7  2013       NA  
     8  2014       NA  
     9  2015        9.7
    10  2016        8.5
    11  2017        9.7
    12  2018       10.6
    13  2019        8.7

    To fix this, we use linear interpolation to fill in 2013 and 2014.

  • v2x_corr is only missing data from Bahrain, which oddly has no data from 1980–2004. Because corruption levels do not really change after 2005, we impute the average corruption for the country in all previous years.

  • v2x_polyarchy is only missing in Mozambique from 1980–1993. To address this, we calculate the average value of V-Dem’s polyarchy index (v2x_polyarchy) for each level of Polity (−8, −7, and −6 in the case of Mozambique), and then use that corresponding average polyarchy

  • We also create an imputed column for those rows in Bahrain and Mozambique to see if imputation does anything weird in the models

  • Kosovo is missing pre-existence infant mortality, which is fine becuase it didn’t exist yet.

  • Russia is missing GDP, GDP per capita, and percent of GDP from trade from 1980–1989. There’s no easy way around this. V-Dem has GDP per capita data from the long-running Maddison Project Database, and it includes 1980s Soviet Russia, but the values aren’t really comparable to the stuff we calculated using UN GDP data. At first glance it seems that this is a difference in real years, since the Maddison Project uses 2011 dollars and the UN uses 2015 dollars, and there’s not an easy way to shift the Maddison Project’s values up to 2015 (i.e. there’s no deflator). But even if they were in the same dollar-years, the values from the Maddison Project seem really really low compared to what we made with the UN GDP data, so they don’t seem to be comparable.

  • Czechoslovakia is missing percent of GDP from trade from 1980–1989. This is because it is missing imports data in the UN GDP data. It has exports data and overall GDP data, but for whatever reason, imports are missing. Boo.

    Code
    country_aid_complete %>% 
      select(gwcode, country, year, un_trade_pct_gdp, un_gdp, gdpcap, gdpcap_log) %>% 
      filter(is.na(un_trade_pct_gdp))
    # A tibble: 20 × 7
       gwcode country  year un_trade_pct_gdp        un_gdp gdpcap gdpcap_log
        <dbl> <chr>   <dbl>            <dbl>         <dbl>  <dbl>      <dbl>
     1    316 Czechia  1980               NA 183919110258. 17772.       9.79
     2    316 Czechia  1981               NA 183743647861. 17726.       9.78
     3    316 Czechia  1982               NA 183984035455. 17750.       9.78
     4    316 Czechia  1983               NA 188240745011. 18180.       9.81
     5    316 Czechia  1984               NA 194289061254. 18789.       9.84
     6    316 Czechia  1985               NA 199875093661. 19347.       9.87
     7    316 Czechia  1986               NA 205065586592. 19857.       9.90
     8    316 Czechia  1987               NA 209182118795. 20255.       9.92
     9    316 Czechia  1988               NA 214531745219. 20766.       9.94
    10    316 Czechia  1989               NA 215359391664. 20836.       9.94
    11    365 Russia   1980               NA           NA     NA       NA   
    12    365 Russia   1981               NA           NA     NA       NA   
    13    365 Russia   1982               NA           NA     NA       NA   
    14    365 Russia   1983               NA           NA     NA       NA   
    15    365 Russia   1984               NA           NA     NA       NA   
    16    365 Russia   1985               NA           NA     NA       NA   
    17    365 Russia   1986               NA           NA     NA       NA   
    18    365 Russia   1987               NA           NA     NA       NA   
    19    365 Russia   1988               NA           NA     NA       NA   
    20    365 Russia   1989               NA           NA     NA       NA   

Since those issues are all pre-1990, our data is perfect post-1990 in cases with Suparna’s law coverage:

Code
country_aid_no_lags %>% 
  filter(laws) %>% 
  gg_miss_var(., show_pct = TRUE) +
  theme_donors()

We do get some missing values when lagging, though, but that only happens in countries that emerged post-1990 (like Kosovo, South Sudan, etc.), since there are no 80s-era values to look at for lagging

Final data

Now that we know all the data is clean and pretty much nothing is missing, we can do a few final windowed operations that will add missing values (e.g. lagging). We also add an indicator marking if a disaster happened in the past 5 years.

In H3 we hypothesize that more aid will be allocated to international or US-based NGOs than domestic NGOs in response to harsher anti-NGO restrictions. While AidData unfortunately does not categorize aid by channel (i.e. aid given to international vs. US vs. domestic NGOs), USAID does. For this hypothesis, then we only look at aid given by USAID, not the rest of the OECD. As with the proportion of contentious aid, we create similar variables to measure the proportion of aid given to international NGOs, US-based NGOs, and both international and US-based NGOs.

Code
glimpse(country_aid_final)
## Rows: 3,298
## Columns: 191
## $ gwcode                         <dbl> 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40,…
## $ year                           <dbl> 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2…
## $ cowcode                        <dbl> 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40, 40,…
## $ country                        <chr> "Cuba", "Cuba", "Cuba", "Cuba", "Cuba", "Cuba", "Cuba", "Cuba", "Cuba", "Cuba",…
## $ iso2                           <chr> "CU", "CU", "CU", "CU", "CU", "CU", "CU", "CU", "CU", "CU", "CU", "CU", "CU", "…
## $ iso3                           <chr> "CUB", "CUB", "CUB", "CUB", "CUB", "CUB", "CUB", "CUB", "CUB", "CUB", "CUB", "C…
## $ un                             <dbl> 192, 192, 192, 192, 192, 192, 192, 192, 192, 192, 192, 192, 192, 192, 192, 192,…
## $ region                         <chr> "Latin America & Caribbean", "Latin America & Caribbean", "Latin America & Cari…
## $ un_region                      <chr> "Americas", "Americas", "Americas", "Americas", "Americas", "Americas", "Americ…
## $ un_subregion                   <chr> "Latin America and the Caribbean", "Latin America and the Caribbean", "Latin Am…
## $ ever_dac_eligible              <lgl> TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, T…
## $ un_trade_pct_gdp               <dbl> 0.711, 0.510, 0.351, 0.289, 0.278, 0.293, 0.326, 0.328, 0.325, 0.319, 0.311, 0.…
## $ un_gdp                         <dbl> 4.70e+10, 4.20e+10, 3.71e+10, 3.16e+10, 3.18e+10, 3.26e+10, 3.52e+10, 3.61e+10,…
## $ population                     <dbl> 10596986, 10673534, 10736386, 10789312, 10838461, 10888246, 10939285, 10989730,…
## $ gdpcap                         <dbl> 4436, 3933, 3457, 2928, 2936, 2994, 3214, 3288, 3279, 3467, 3659, 3762, 3804, 3…
## $ gdpcap_log                     <dbl> 8.40, 8.28, 8.15, 7.98, 7.98, 8.00, 8.08, 8.10, 8.10, 8.15, 8.20, 8.23, 8.24, 8…
## $ population_log                 <dbl> 16.2, 16.2, 16.2, 16.2, 16.2, 16.2, 16.2, 16.2, 16.2, 16.2, 16.2, 16.2, 16.2, 1…
## $ advocacy                       <dbl> 1, 1, 1, 1, 1, 1, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 0, 0, 0…
## $ entry                          <dbl> 0, 0, 0, 0, 0, 0, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 2, 2, 2…
## $ funding                        <dbl> 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5,…
## $ entry_std                      <dbl> 0.000, 0.000, 0.000, 0.000, 0.000, 0.000, 1.000, 1.000, 1.000, 1.000, 1.000, 1.…
## $ funding_std                    <dbl> 0.000, 0.000, 0.000, 0.000, 0.000, 0.000, 1.000, 1.000, 1.000, 1.000, 1.000, 1.…
## $ advocacy_std                   <dbl> 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 1.0, 1.0, 1.0, 1.0, 1.0, 1.0, 1.0, 1.0, 1.0, 1.0,…
## $ barriers_total                 <dbl> 1.0, 1.0, 1.0, 1.0, 1.0, 1.0, 9.5, 9.5, 9.5, 9.5, 9.5, 9.5, 9.5, 9.5, 9.5, 9.5,…
## $ barriers_total_std             <dbl> 0.500, 0.500, 0.500, 0.500, 0.500, 0.500, 3.000, 3.000, 3.000, 3.000, 3.000, 3.…
## $ ngo_register                   <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1…
## $ ngo_register_burden            <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1…
## $ ngo_register_appeal            <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1…
## $ ngo_barrier_foreign_funds      <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0…
## $ ngo_disclose_funds             <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1…
## $ ngo_foreign_fund_approval      <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1…
## $ ngo_foreign_fund_channel       <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0…
## $ ngo_foreign_fund_restrict      <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0…
## $ ngo_foreign_fund_prohibit      <dbl> 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5,…
## $ ngo_type_foreign_fund_prohibit <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0…
## $ ngo_politics                   <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0…
## $ ngo_politics_foreign_fund      <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0…
## $ laws                           <lgl> TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, T…
## $ v2cseeorgs                     <dbl> -2.425, -2.425, -2.425, -2.425, -2.425, -2.425, -2.425, -2.425, -2.425, -2.425,…
## $ v2csreprss                     <dbl> -1.352, -1.352, -1.352, -1.352, -1.352, -1.352, -1.352, -1.352, -1.352, -1.352,…
## $ v2cscnsult                     <dbl> -1.038, -1.038, -1.038, -1.038, -1.038, -1.038, -1.038, -1.038, -1.038, -1.038,…
## $ v2csprtcpt                     <dbl> -2.305, -2.305, -2.305, -2.305, -2.305, -2.305, -2.305, -2.305, -2.305, -2.305,…
## $ v2csgender                     <dbl> 1.480, 1.480, 1.480, 1.480, 1.480, 1.480, 1.480, 1.480, 1.480, 1.480, 1.480, 1.…
## $ v2csantimv                     <dbl> -0.188, -0.188, -0.188, -0.188, 0.476, -0.564, -0.564, -0.564, -0.564, -0.564, …
## $ v2xcs_ccsi                     <dbl> 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.…
## $ v2x_corr                       <dbl> 0.375, 0.375, 0.419, 0.419, 0.419, 0.419, 0.419, 0.419, 0.419, 0.419, 0.419, 0.…
## $ v2x_rule                       <dbl> 0.301, 0.301, 0.259, 0.284, 0.284, 0.284, 0.284, 0.284, 0.284, 0.284, 0.284, 0.…
## $ v2x_civlib                     <dbl> 0.309, 0.309, 0.311, 0.304, 0.304, 0.317, 0.320, 0.332, 0.321, 0.331, 0.334, 0.…
## $ v2x_clphy                      <dbl> 0.808, 0.808, 0.808, 0.796, 0.796, 0.796, 0.796, 0.796, 0.796, 0.796, 0.798, 0.…
## $ v2x_clpriv                     <dbl> 0.060, 0.060, 0.080, 0.080, 0.080, 0.103, 0.087, 0.110, 0.122, 0.137, 0.137, 0.…
## $ v2x_clpol                      <dbl> 0.052, 0.052, 0.052, 0.058, 0.058, 0.058, 0.058, 0.053, 0.051, 0.051, 0.057, 0.…
## $ v2x_polyarchy                  <dbl> 0.073, 0.073, 0.073, 0.113, 0.120, 0.120, 0.120, 0.124, 0.121, 0.121, 0.114, 0.…
## $ v2peedueq                      <dbl> 2.34, 2.34, 2.34, 2.34, 2.34, 1.89, 1.89, 1.89, 1.89, 1.89, 1.89, 1.89, 1.89, 1…
## $ v2pehealth                     <dbl> 2.71, 2.71, 2.71, 2.23, 2.23, 2.23, 2.23, 2.23, 2.23, 2.23, 2.23, 2.23, 2.23, 2…
## $ e_peinfmor                     <dbl> 10.6, 9.8, 9.3, 8.8, 8.6, 8.4, 8.2, 7.8, 7.3, 6.9, 6.5, 6.1, 5.9, 5.6, 5.4, 5.1…
## $ internal_conflict              <lgl> FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FA…
## $ natural_dis_deaths             <dbl> 4, 0, 0, 51, 14, 2, 3, 3, 6, 4, 2, 5, 3, 0, 4, 20, 2, 1, 7, 0, 0, 0, 14, 2, 0, …
## $ natural_dis_injured            <dbl> 0, 0, 40, 95, 0, 3, 0, 0, 0, 0, 0, 12, 0, 0, 5, 0, 8, 0, 19, 0, 0, 0, 0, 0, 0, …
## $ natural_dis_affected           <dbl> 5000, 0, 14956, 739038, 106338, 33340, 280861, 35823, 967000, 228067, 675, 5900…
## $ natural_dis_homeless           <dbl> 6000, 0, 0, 32000, 42820, 0, 66681, 0, 0, 26923, 0, 0, 0, 0, 41500, 0, 0, 0, 0,…
## $ natural_dis_total_affected     <dbl> 11000, 0, 14996, 771133, 149158, 33343, 347542, 35823, 967000, 254990, 675, 590…
## $ natural_dis_total_damage       <dbl> 0, 0, 2590, 1140000, 101968, 2000, 13000, 0, 2180000, 0, 0, 100000, 46000, 0, 1…
## $ natural_dis_count              <dbl> 2, 0, 2, 5, 2, 3, 3, 2, 2, 2, 2, 1, 3, 1, 3, 2, 2, 3, 5, 0, 0, 0, 3, 1, 1, 0, 1…
## $ post_1989                      <lgl> TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, T…
## $ total_oda                      <dbl> 3.45e+06, 2.14e+05, 1.46e+06, 3.92e+06, 1.16e+07, 2.75e+07, 5.36e+07, 9.03e+07,…
## $ oda_contentious_low            <dbl> 3.45e+06, 2.14e+05, 1.46e+06, 3.92e+06, 1.16e+07, 2.71e+07, 4.38e+07, 8.13e+07,…
## $ oda_contentious_high           <dbl> 0.00e+00, 0.00e+00, 0.00e+00, 0.00e+00, 1.80e+04, 4.79e+05, 9.72e+06, 9.04e+06,…
## $ oda_us                         <dbl> 2.79e+05, 6.91e+05, 1.68e+06, 7.80e+05, 8.06e+05, 1.19e+06, 3.37e+06, 7.44e+05,…
## $ oda_us_ngo_dom                 <dbl> 232193, 481725, 1391110, 527175, 557722, 603056, 352073, 299389, 388866, 418600…
## $ oda_us_ngo_int                 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2185282, 1025613, 0, 2000…
## $ oda_us_ngo_us                  <dbl> 46439, 209010, 292155, 252331, 248209, 589647, 455587, 444933, 78034, 537315, 5…
## $ imputed_corr                   <lgl> FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FA…
## $ imputed_polyarchy              <lgl> FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FA…
## $ total_oda_z                    <dbl[,1]> <matrix[40 x 1]>
## $ gdpcap_log_z                   <dbl[,1]> <matrix[40 x 1]>
## $ year_c                         <dbl> -10, -9, -8, -7, -6, -5, -4, -3, -2, -1, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, …
## $ prop_contentious               <dbl> 0.00000, 0.00000, 0.00000, 0.00000, 0.00155, 0.01740, 0.18146, 0.10006, 0.0…
## $ prop_contentious_logit         <dbl> -6.91, -6.91, -6.91, -6.91, -5.97, -3.98, -1.50, -2.19, -5.08, -3.23, -2.10, -2…
## $ prop_ngo_int                   <dbl> 0.00e+00, 0.00e+00, 0.00e+00, 0.00e+00, 0.00e+00, 0.00e+00, 0.00e+00, 0.00e+00,…
## $ prop_ngo_us                    <dbl> 0.166668, 0.302591, 0.173564, 0.323707, 0.307978, 0.494379, 0.135316, 0.597770,…
## $ prop_ngo_dom                   <dbl> 0.833332, 0.697409, 0.826436, 0.676293, 0.692022, 0.505621, 0.104571, 0.402230,…
## $ prop_ngo_foreign               <dbl> 0.166668, 0.302591, 0.173564, 0.323707, 0.307978, 0.494379, 0.135316, 0.597770,…
## $ prop_ngo_int_logit             <dbl> -6.91, -6.91, -6.91, -6.91, -6.91, -6.91, -6.91, -6.91, -6.91, -6.91, -6.91, -6…
## $ prop_ngo_us_logit              <dbl> -1.6046, -0.8331, -1.5560, -0.7352, -0.8078, -0.0224, -1.8485, 0.3954, -1.7551,…
## $ prop_ngo_dom_logit             <dbl> 1.6046, 0.8331, 1.5560, 0.7352, 0.8078, 0.0224, -2.1390, -0.3954, 0.9976, -0.24…
## $ prop_ngo_foreign_logit         <dbl> -1.6046, -0.8331, -1.5560, -0.7352, -0.8078, -0.0224, -1.8485, 0.3954, -1.7551,…
## $ total_oda_log                  <dbl> 15.1, 12.3, 14.2, 15.2, 16.3, 17.1, 17.8, 18.3, 20.8, 18.3, 18.9, 18.6, 18.6, 1…
## $ oda_contentious_high_log       <dbl> 0.0, 0.0, 0.0, 0.0, 9.8, 13.1, 16.1, 16.0, 15.6, 15.0, 16.7, 16.2, 16.9, 16.4, …
## $ oda_contentious_low_log        <dbl> 15.1, 12.3, 14.2, 15.2, 16.3, 17.1, 17.6, 18.2, 20.8, 18.3, 18.8, 18.5, 18.4, 1…
## $ oda_us_log                     <dbl> 12.5, 13.4, 14.3, 13.6, 13.6, 14.0, 15.0, 13.5, 13.2, 13.8, 15.5, 15.3, 16.1, 1…
## $ prop_contentious_trunc         <dbl> 0.00000, 0.00000, 0.00000, 0.00000, 0.00155, 0.01740, 0.18146, 0.10006, 0.00521…
## $ prop_ngo_int_trunc             <dbl> 0.00e+00, 0.00e+00, 0.00e+00, 0.00e+00, 0.00e+00, 0.00e+00, 0.00e+00, 0.00e+00,…
## $ prop_ngo_us_trunc              <dbl> 0.166668, 0.302591, 0.173564, 0.323707, 0.307978, 0.494379, 0.135316, 0.597770,…
## $ prop_ngo_dom_trunc             <dbl> 0.833332, 0.697409, 0.826436, 0.676293, 0.692022, 0.505621, 0.104571, 0.402230,…
## $ prop_ngo_foreign_trunc         <dbl> 0.166668, 0.302591, 0.173564, 0.323707, 0.307978, 0.494379, 0.135316, 0.597770,…
## $ internal_conflict_past_5       <lgl> FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FA…
## $ natural_dis_past_5             <lgl> TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, T…
## $ advocacy_new                   <dbl> NA, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, 0,…
## $ advocacy_worse                 <lgl> NA, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE,…
## $ advocacy_cat                   <ord> NA, No new laws, No new laws, No new laws, No new laws, No new laws, New worse …
## $ entry_new                      <dbl> NA, 0, 0, 0, 0, 0, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, 0,…
## $ entry_worse                    <lgl> NA, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE,…
## $ entry_cat                      <ord> NA, No new laws, No new laws, No new laws, No new laws, No new laws, New worse …
## $ funding_new                    <dbl> NA, 0.0, 0.0, 0.0, 0.0, 0.0, 4.5, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, …
## $ funding_worse                  <lgl> NA, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE,…
## $ funding_cat                    <ord> NA, No new laws, No new laws, No new laws, No new laws, No new laws, New worse …
## $ barriers_total_new             <dbl> NA, 0.0, 0.0, 0.0, 0.0, 0.0, 8.5, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, …
## $ barriers_total_worse           <lgl> NA, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE,…
## $ barriers_total_cat             <ord> NA, No new laws, No new laws, No new laws, No new laws, No new laws, New worse …
## $ barriers_total_lag1            <dbl> NA, 1.0, 1.0, 1.0, 1.0, 1.0, 1.0, 9.5, 9.5, 9.5, 9.5, 9.5, 9.5, 9.5, 9.5, 9.5, …
## $ barriers_total_lag2            <dbl> NA, NA, 1.0, 1.0, 1.0, 1.0, 1.0, 1.0, 9.5, 9.5, 9.5, 9.5, 9.5, 9.5, 9.5, 9.5, 9…
## $ advocacy_lag1                  <dbl> NA, 1, 1, 1, 1, 1, 1, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, NA, 0,…
## $ advocacy_lag2                  <dbl> NA, NA, 1, 1, 1, 1, 1, 1, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, NA, N…
## $ entry_lag1                     <dbl> NA, 0, 0, 0, 0, 0, 0, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, NA, 2,…
## $ entry_lag2                     <dbl> NA, NA, 0, 0, 0, 0, 0, 0, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, NA, N…
## $ funding_lag1                   <dbl> NA, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, …
## $ funding_lag2                   <dbl> NA, NA, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4…
## $ barriers_total_new_lag1        <dbl> NA, NA, 0.0, 0.0, 0.0, 0.0, 0.0, 8.5, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0…
## $ barriers_total_new_lag2        <dbl> NA, NA, NA, 0.0, 0.0, 0.0, 0.0, 0.0, 8.5, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.…
## $ advocacy_new_lag1              <dbl> NA, NA, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, N…
## $ advocacy_new_lag2              <dbl> NA, NA, NA, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, …
## $ entry_new_lag1                 <dbl> NA, NA, 0, 0, 0, 0, 0, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, N…
## $ entry_new_lag2                 <dbl> NA, NA, NA, 0, 0, 0, 0, 0, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, …
## $ funding_new_lag1               <dbl> NA, NA, 0.0, 0.0, 0.0, 0.0, 0.0, 4.5, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0…
## $ funding_new_lag2               <dbl> NA, NA, NA, 0.0, 0.0, 0.0, 0.0, 0.0, 4.5, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.…
## $ v2xcs_ccsi_lag1                <dbl> 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.…
## $ v2xcs_ccsi_lag2                <dbl> 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.064, 0.…
## $ v2csreprss_lag1                <dbl> -1.352, -1.352, -1.352, -1.352, -1.352, -1.352, -1.352, -1.352, -1.352, -1.352,…
## $ v2csreprss_lag2                <dbl> -1.352, -1.352, -1.352, -1.352, -1.352, -1.352, -1.352, -1.352, -1.352, -1.352,…
## $ total_oda_lag1                 <dbl> 7.38e+07, 3.45e+06, 2.14e+05, 1.46e+06, 3.92e+06, 1.16e+07, 2.75e+07, 5.36e+07,…
## $ total_oda_lag2                 <dbl> 9.76e+07, 7.38e+07, 3.45e+06, 2.14e+05, 1.46e+06, 3.92e+06, 1.16e+07, 2.75e+07,…
## $ total_oda_log_lag1             <dbl> 18.1, 15.1, 12.3, 14.2, 15.2, 16.3, 17.1, 17.8, 18.3, 20.8, 18.3, 18.9, 18.6, 1…
## $ total_oda_log_lag2             <dbl> 18.4, 18.1, 15.1, 12.3, 14.2, 15.2, 16.3, 17.1, 17.8, 18.3, 20.8, 18.3, 18.9, 1…
## $ total_oda_z_lag1               <dbl[,1]> <matrix[40 x 1]>
## $ total_oda_z_lag2               <dbl[,1]> <matrix[40 x 1]>
## $ prop_contentious_lag1          <dbl> 0.00000, 0.00000, 0.00000, 0.00000, 0.00000, 0.00155, 0.01740, 0.18146, 0.10006…
## $ prop_contentious_lag2          <dbl> 0.00000, 0.00000, 0.00000, 0.00000, 0.00000, 0.00000, 0.00155, 0.01740, 0.18146…
## $ prop_contentious_trunc_lag1    <dbl> 0.00000, 0.00000, 0.00000, 0.00000, 0.00000, 0.00155, 0.01740, 0.18146, 0.1…
## $ prop_contentious_trunc_lag2    <dbl> 0.00000, 0.00000, 0.00000, 0.00000, 0.00000, 0.00000, 0.00155, 0.01740, 0.1…
## $ prop_contentious_logit_lag1    <dbl> -6.91, -6.91, -6.91, -6.91, -6.91, -5.97, -3.98, -1.50, -2.19, -5.08, -3.23, -2…
## $ prop_contentious_logit_lag2    <dbl> -6.91, -6.91, -6.91, -6.91, -6.91, -6.91, -5.97, -3.98, -1.50, -2.19, -5.08, -3…
## $ prop_ngo_dom_lag1              <dbl> 0.000000, 0.833332, 0.697409, 0.826436, 0.676293, 0.692022, 0.505621, 0.104571,…
## $ prop_ngo_dom_lag2              <dbl> 0.000000, 0.000000, 0.833332, 0.697409, 0.826436, 0.676293, 0.692022, 0.505621,…
## $ prop_ngo_foreign_lag1          <dbl> 0.000000, 0.166668, 0.302591, 0.173564, 0.323707, 0.307978, 0.494379, 0.135316,…
## $ prop_ngo_foreign_lag2          <dbl> 0.000000, 0.000000, 0.166668, 0.302591, 0.173564, 0.323707, 0.307978, 0.494379,…
## $ prop_ngo_dom_trunc_lag1        <dbl> 0.000000, 0.833332, 0.697409, 0.826436, 0.676293, 0.692022, 0.505621, 0.104571,…
## $ prop_ngo_dom_trunc_lag2        <dbl> 0.000000, 0.000000, 0.833332, 0.697409, 0.826436, 0.676293, 0.692022, 0.505621,…
## $ prop_ngo_foreign_trunc_lag1    <dbl> 0.000000, 0.166668, 0.302591, 0.173564, 0.323707, 0.307978, 0.494379, 0.135316,…
## $ prop_ngo_foreign_trunc_lag2    <dbl> 0.000000, 0.000000, 0.166668, 0.302591, 0.173564, 0.323707, 0.307978, 0.494379,…
## $ prop_ngo_dom_logit_lag1        <dbl> -6.9068, 1.6046, 0.8331, 1.5560, 0.7352, 0.8078, 0.0224, -2.1390, -0.3954, 0.99…
## $ prop_ngo_dom_logit_lag2        <dbl> -6.9068, -6.9068, 1.6046, 0.8331, 1.5560, 0.7352, 0.8078, 0.0224, -2.1390, -0.3…
## $ prop_ngo_foreign_logit_lag1    <dbl> -6.9068, -1.6046, -0.8331, -1.5560, -0.7352, -0.8078, -0.0224, -1.8485, 0.3954,…
## $ prop_ngo_foreign_logit_lag2    <dbl> -6.9068, -6.9068, -1.6046, -0.8331, -1.5560, -0.7352, -0.8078, -0.0224, -1.8485…
## $ barriers_total_lag1_cumsum     <dbl> 0.0, 1.0, 2.0, 3.0, 4.0, 5.0, 6.0, 15.5, 25.0, 34.5, 44.0, 53.5, 63.0, 72.5, 82…
## $ advocacy_lag1_cumsum           <dbl> 0, 1, 2, 3, 4, 5, 6, 8, 10, 12, 14, 16, 18, 20, 22, 24, 26, 28, 30, 32, 34, 36,…
## $ entry_lag1_cumsum              <dbl> 0, 0, 0, 0, 0, 0, 0, 3, 6, 9, 12, 15, 18, 21, 24, 27, 30, 33, 36, 39, 42, 45, 4…
## $ funding_lag1_cumsum            <dbl> 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 4.5, 9.0, 13.5, 18.0, 22.5, 27.0, 31.5, 36.0…
## $ barriers_total_new_lag1_cumsum <dbl> 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 8.5, 8.5, 8.5, 8.5, 8.5, 8.5, 8.5, 8.5, 8.5,…
## $ advocacy_new_lag1_cumsum       <dbl> 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0…
## $ entry_new_lag1_cumsum          <dbl> 0, 0, 0, 0, 0, 0, 0, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 0, 0, 0…
## $ funding_new_lag1_cumsum        <dbl> 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5,…
## $ v2xcs_ccsi_lag1_cumsum         <dbl> 0.528, 0.592, 0.656, 0.720, 0.784, 0.848, 0.912, 0.976, 1.040, 1.104, 1.168, 1.…
## $ v2csreprss_lag1_cumsum         <dbl> -18.9, -20.2, -21.6, -22.9, -24.3, -25.6, -27.0, -28.3, -29.7, -31.0, -32.4, -3…
## $ barriers_total_lag2_cumsum     <dbl> 0.0, 0.0, 1.0, 2.0, 3.0, 4.0, 5.0, 6.0, 15.5, 25.0, 34.5, 44.0, 53.5, 63.0, 72.…
## $ advocacy_lag2_cumsum           <dbl> 0, 0, 1, 2, 3, 4, 5, 6, 8, 10, 12, 14, 16, 18, 20, 22, 24, 26, 28, 30, 32, 34, …
## $ entry_lag2_cumsum              <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 3, 6, 9, 12, 15, 18, 21, 24, 27, 30, 33, 36, 39, 42, 45…
## $ funding_lag2_cumsum            <dbl> 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 4.5, 9.0, 13.5, 18.0, 22.5, 27.0, 31.5,…
## $ barriers_total_new_lag2_cumsum <dbl> 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 8.5, 8.5, 8.5, 8.5, 8.5, 8.5, 8.5, 8.5,…
## $ advocacy_new_lag2_cumsum       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0…
## $ entry_new_lag2_cumsum          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 0, 0, 0…
## $ funding_new_lag2_cumsum        <dbl> 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 0.0, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5, 4.5,…
## $ v2xcs_ccsi_lag2_cumsum         <dbl> 0.464, 0.528, 0.592, 0.656, 0.720, 0.784, 0.848, 0.912, 0.976, 1.040, 1.104, 1.…
## $ v2csreprss_lag2_cumsum         <dbl> -17.5, -18.9, -20.2, -21.6, -22.9, -24.3, -25.6, -27.0, -28.3, -29.7, -31.0, -3…
## $ total_oda_lead1                <dbl> 2.14e+05, 1.46e+06, 3.92e+06, 1.16e+07, 2.75e+07, 5.36e+07, 9.03e+07, 1.12e+09,…
## $ total_oda_log_lead1            <dbl> 12.3, 14.2, 15.2, 16.3, 17.1, 17.8, 18.3, 20.8, 18.3, 18.9, 18.6, 18.6, 18.8, 1…
## $ total_oda_z_lead1              <dbl[,1]> <matrix[40 x 1]>
## $ oda_us_lead1                   <dbl> 6.91e+05, 1.68e+06, 7.80e+05, 8.06e+05, 1.19e+06, 3.37e+06, 7.44e+05, 5.32e+05,…
## $ oda_us_log_lead1               <dbl> 13.4, 14.3, 13.6, 13.6, 14.0, 15.0, 13.5, 13.2, 13.8, 15.5, 15.3, 16.1, 16.0, 1…
## $ oda_contentious_low_lead1      <dbl> 2.14e+05, 1.46e+06, 3.92e+06, 1.16e+07, 2.71e+07, 4.38e+07, 8.13e+07, 1.11e+09,…
## $ oda_contentious_high_lead1     <dbl> 0.00e+00, 0.00e+00, 0.00e+00, 1.80e+04, 4.79e+05, 9.72e+06, 9.04e+06, 5.83e+06,…
## $ prop_contentious_lead1         <dbl> 0.00000, 0.00000, 0.00000, 0.00155, 0.01740, 0.18146, 0.10006, 0.00521, 0.0…
## $ prop_contentious_trunc_lead1   <dbl> 0.00000, 0.00000, 0.00000, 0.00155, 0.01740, 0.18146, 0.10006, 0.00521, 0.03699…
## $ prop_contentious_logit_lead1   <dbl> -6.91, -6.91, -6.91, -5.97, -3.98, -1.50, -2.19, -5.08, -3.23, -2.10, -2.23, -1…
## $ oda_us_ngo_dom_lead1           <dbl> 481725, 1391110, 527175, 557722, 603056, 352073, 299389, 388866, 418600, 558405…
## $ oda_us_ngo_int_lead1           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2185282, 1025613, 0, 2000000…
## $ prop_ngo_dom_lead1             <dbl> 0.697409, 0.826436, 0.676293, 0.692022, 0.505621, 0.104571, 0.402230, 0.731051,…
## $ prop_ngo_foreign_lead1         <dbl> 0.302591, 0.173564, 0.323707, 0.307978, 0.494379, 0.135316, 0.597770, 0.146700,…
## $ prop_ngo_dom_trunc_lead1       <dbl> 0.697409, 0.826436, 0.676293, 0.692022, 0.505621, 0.104571, 0.402230, 0.731051,…
## $ prop_ngo_foreign_trunc_lead1   <dbl> 0.302591, 0.173564, 0.323707, 0.307978, 0.494379, 0.135316, 0.597770, 0.146700,…
## $ prop_ngo_dom_logit_lead1       <dbl> 0.8331, 1.5560, 0.7352, 0.8078, 0.0224, -2.1390, -0.3954, 0.9976, -0.2492, -2.1…
## $ prop_ngo_foreign_logit_lead1   <dbl> -0.8331, -1.5560, -0.7352, -0.8078, -0.0224, -1.8485, 0.3954, -1.7551, 0.2492, …

References

Finkel, Steven E., Anı́bal Pérez-Liñán, and Mitchell A. Seligson. 2007. “The Effects of U.S. Foreign Assistance on Democracy Building, 1990–2003.” World Politics 59 (3): 404–38. https://doi.org/10.1017/s0043887100020876.