New R package: scholar: http://www.r-bloggers.com/new-r-package-scholar/
kaz_yos @ GoogleScholar: http://scholar.google.com/citations?hl=en&user=yy0muuIAAAAJ
## For information retrieval
library(scholar)
## For data manipulation
library(plyr)
## For plotting
library(ggplot2)
## My ID
kaz_yos <- "yy0muuIAAAAJ"
## Retrieve data
df <- compare_scholar_careers(kaz_yos)
## Add cumulative citation
df <- ddply(.data = df,
.variables = c("id"),
.fun = transform,
cumulative_cites = cumsum(cites))
## Plot
ggplot(df,
mapping = aes(x = career_year, y = cumulative_cites, color = name)) +
layer(geom = "line") +
theme_bw()