Load and Inspect the Data

phish_data <- read_csv("phish_concerts_1992_1994.csv")

colnames(phish_data)
## [1] "date"       "venue"      "city"       "state_abbr" "state_name"
## [6] "country"    "year"       "month"      "season"
head(phish_data)
## # A tibble: 6 × 9
##   date       venue        city  state_abbr state_name country  year month season
##   <date>     <chr>        <chr> <chr>      <chr>      <chr>   <dbl> <dbl> <chr> 
## 1 1992-01-05 Hampton Col… Chic… OH         Ohio       USA      1992     1 Winter
## 2 1992-01-13 Rosemont Ho… Phoe… NM         New Mexico USA      1992     1 Winter
## 3 1992-01-20 UIC Pavilion Minn… NM         New Mexico USA      1992     1 Winter
## 4 1992-01-26 Hampton Col… Minn… QC         Quebec     Canada   1992     1 Winter
## 5 1992-02-03 Deer Creek … Detr… FL         Florida    USA      1992     2 Winter
## 6 1992-02-08 Red Rocks A… San … CA         California USA      1992     2 Winter
# Confirm 'state' column exists
phish_data <- phish_data %>%
  filter(country == "USA") %>%  
  mutate(state = state_abbr)

Define Functions for Mapping

plot_yearly_map <- function(data, year) {
  yearly_data <- data %>%
    filter(year == !!year) %>%
    count(state)

  plot_usmap(data = yearly_data, values = "n", color = "white") +
    scale_fill_continuous(low = "lightblue", high = "darkblue", name = "Concerts") +
    labs(title = paste("Phish Concerts in", year)) +
    theme(legend.position = "right")
}

plot_cumulative_map <- function(data) {
  cumulative_data <- data %>%
    count(state)

  plot_usmap(data = cumulative_data, values = "n", color = "white") +
    scale_fill_continuous(low = "lightgreen", high = "darkgreen", name = "Concerts") +
    labs(title = "Cumulative Phish Concerts (1992–1994)") +
    theme(legend.position = "right")
}

Yearly Maps

plot_yearly_map(phish_data, 1992)

plot_yearly_map(phish_data, 1993)

plot_yearly_map(phish_data, 1994)

Cumulative Map

plot_cumulative_map(phish_data)

Summary

  • Figures show geographic spread of Phish concerts.

  • Highest concentrations in northeast and west coast (as visible).

  • Year-by-year trends show growth in certain regions.

  • Cumulative maps highlight key states where Phish performed frequently.

  • This visual analysis helps understand geographic touring trends of Phish during the early 1990s.