Here's a quick work-up of membership growth in the Davis R Users' Group. The data come from exporting the google group membership file, which I'm not including because it has everyone's names and addresses.
drug <- read.csv("davis-rug (4).csv", skip = 1, stringsAsFactors = FALSE)
# Google formats the dates as a bunch of columns, so I put them together:
drug <- within(drug, {
joindate <- ISOdatetime(Join.year, Join.month, Join.day, Join.hour, Join.minute,
Join.second)
})
# Sort by join data and add an accumulation column
drug <- drug[order(drug$joindate), ]
drug$member <- 1:nrow(drug)
# Plot with my custom ggplot theme:
library(ggplot2)
library(noamtools)
## Loading required package: plyr
ggplot(drug, aes(x = joindate, y = member)) + geom_line() + theme_nr + ylab("Number of Members") +
xlab("Date")
Yay! Getter bigger all the time.