##Import the data

##Plot 1: Annual Contributions by Country

## `summarise()` has grouped output by 'Year'. You can override using the
## `.groups` argument.

##Plot 2: Cumulative Contributions by Country and Transaction Type

## `summarise()` has grouped output by 'Country'. You can override using the
## `.groups` argument.

##Plot 3: Cumulative Contributions by Country

data %>%
  group_by(Country) %>%
  summarise(Total.Amount = sum(Amount)) %>%
  ggplot(aes(x = Country, y = Total.Amount, fill = Country)) +
  geom_bar(stat = "identity", position = "stack") +
  labs(title = "Syracuse University's Cumulative Major Foreign Transactions by Country",
              subtitle = "College Foreign Gift Reporting, U.S. Department of Education | Visualization : M.D.Hammami",
       x = "Country", y = "Total Amount ($)") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1))