I am analyzing 10-year data by region. The variable of interest is median (service delay in days).
One possible way of analyzing the data is to generate line plots, which I have already done in the example below.
I am looking for more options and ideas on how to analyze the medians-- It cold be new plots/ stats/ tables. Thanks!
suppressWarnings(suppressMessages(library(tidyverse)))
set.seed(1234)
toy_data <- tibble(
year = rep(2008:2017, times = 4),
region = rep(c("A", "B", "C", "D"), each = 10),
median = c(rnorm(20, mean = 30, sd = 7), rnorm(20, mean = 35, sd = 2))
)
toy_data %>%
ggplot(aes(x = year, y = median, color = region)) +
geom_line()
Created on 2020-11-18 by the reprex package (v0.3.0)