Views bar chart
## By year
Year <- pageviews.clean %>%
ggplot(aes(x = factor(Year), y = Pageviews, fill = factor(Year))) +
geom_bar(stat = "identity", position = position_dodge()) +
theme_bw()
ggplotly(Year)
## By month
Month <- pageviews.clean %>%
ggplot(aes(x = factor(Month), y = Pageviews, fill = factor(Month))) +
geom_bar(stat = "identity", position = position_dodge()) +
theme_bw()
ggplotly(Month)
## By year and month
YearMonth <- pageviews.clean %>%
ggplot(aes(x = factor(Month), y = Pageviews, fill = factor(Month))) +
geom_bar(stat = "identity", position = position_dodge()) +
facet_wrap(~Year) +
theme_bw()
ggplotly(YearMonth)