FRC Event Wins by Alliance Seed

Win distribution, weeks 1 and 2

Code
suppressPackageStartupMessages({
    library(tidyverse)
    library(scales)
    library(plotly)
})

ggplotly(
    ggplot(df, aes(y = win_pct, x = year, color = alliance)) + 
    geom_line() + 
    scale_y_continuous(labels = label_percent()) + 
    theme_bw() +
    theme(legend.position = "bottom") + 
    labs(title = "FRC Alliance Event Win Percentage", 
         x = "Year", y = "Event Win Percentage", color = "Alliance Seed")
)