We are going to try to knit and send an html file
This will be a pretty cool trelliscope graph
library(ggplot2)
library(trelliscopejs)
library(tidyverse)
# Read file
tx <- read.csv("tx.csv")
tx <- as.tibble(tx)
tx %>%
filter(tip_amount < 12) %>%
ggplot( aes(x = tip_amount)) +
geom_histogram() +
ylim(c(0, 1200)) +
facet_trelliscope(~ pick_day,
name = "Date",
desc = "Route data range from 7/1/2016 to 12/31/2016",
nrow = 2,
ncol = 3,
scales = c("same", "same"),
path = ".",
self_contained = TRUE)