Daily Count
library(tidyverse); library(magrittr); library(cranlogs); library(plotly)
downloads <- cran_downloads("Relexon", from = "2019-03-14", to = Sys.Date()) %>%
as.data.frame()
base_plot <- downloads %>%
ggplot(mapping = aes(x = date)) +
theme_bw() +
scale_x_date(
date_breaks = "1 months",
date_labels = "%b-%y")
ggplotly(
base_plot +
geom_line(aes(y = count),
colour = "darkgreen",
alpha = 0.75,
size = 1) +
theme_bw() +
labs("Date",
y = "Count",
title = "Relexon Downloads - Daily")
)
Cumulative Count
ggplotly(
base_plot +
geom_line(aes(y = cumsum(count)),
colour = "darkgreen",
alpha = 0.75,
size = 1) +
theme_bw() +
labs("Date",
y = "Count",
title = "Relexon Downloads - Cumulative")
)