library(ggplot2)
df.tmp <- read.csv("launch-data.csv")
df <- data.frame(df.tmp[2], df.tmp[3], df.tmp[4])
names(df)[1] <- "final_state"
names(df)[2] <- "start_time"
names(df)[3] <- "launch_time"
df$start_time <- as.POSIXct(df$start_time, origin = "1970-01-01")
df <- df[df$final_stat == "running", ]
df$day <- as.factor(format(df$start_time, "%m-%d"))
ggplot(df, aes(launch_time, alpha = 0.6)) + geom_histogram(binwidth = 5)
ggplot(df, aes(launch_time, fill = day, alpha = 0.6)) + geom_histogram(binwidth = 5) +
facet_wrap(~day)
ggplot(df, aes(day, launch_time, fill = day, alpha = 0.6)) + geom_boxplot(binwidth = 5)