pac_all: Foreign-Connected PAC Contributions, all years, clean data

pac_allR Documentation

Foreign-Connected PAC Contributions, all years, clean data

Description

Every election cycle brings its own brand of excitement – and lots of money. Political donations are of particular interest to political scientists and other researchers studying politics and voting patterns. They are also of interest to citizens who want to stay informed of how much money their candidates raise and where that money comes from.

Usage

pac_all

Format

A tibble with 2156 rows and 7 variables:

name

Name of company (American divisions of a foreign company)

country

Country of origin

parent

PAC parent company

total

Total PAC contributions to all parties

dems

PAC contributions to the Democratic Party

repubs

PAC contributions to the Republican Party

year

Election cycle year

Details

In the United States, “only American citizens (and immigrants with green cards) can contribute to federal politics, but the American divisions of foreign companies can form political action committees (PACs) and collect contributions from their American employees.” (source: OpenSecrets.org)

The data come from the OpenSecrets.org.

The data were scraped from the OpenSecrets.org website in June 2020. It is part of a series of similar datasets in this package consisting of datasets collected from OpenSecrets via webscraping.

This particular dataset consists of the data for foreign-connected PAC contributions for all available elections cycles, in raw form as it was when scraped from the website on 11 Nov 2020.

Source

https://www.opensecrets.org/political-action-committees-pacs/foreign-connected-pacs/2022

See Also

pac_2020_raw, pac_2020, pac_all_raw

Examples


library(dplyr)
library(ggplot2)

pac_all |>
  filter(country %in% c("Canada", "UK")) |>
  group_by(country, year) |>
  summarise(tot = sum(total)) |>
  ggplot(aes(x = year, y = tot, group = country, color = country)) +
  geom_line() +
  labs(
    x = "Year",
    y = "Total Contributions",
    color = "Country"
  )



rstudio-education/dsbox documentation built on Oct. 22, 2023, 12:20 a.m.