Retrieving basic information
## Define the id for Richard Feynman
<- 'B7vSqZsAAAAJ'
id
## Get his profile
<- get_profile(id)
l
## Print his name and affliation
$name l
## [1] "Richard Feynman"
$affiliation l
## [1] "California Institute of Technology"
## Print his citation index
$h_index l
## [1] 59
$i10_index l
## [1] 97
Retrieving publications
get_publications()
return a data.frame
of
publication records. It contains information of the publications,
including title, author list, page number,
citation number, publication year, etc..
The pubid
is the article ID used by Google Scholar and
the identifier that is used to retrieve the citation history of a
selected publication.
## Get his publications (a large data frame)
<- get_publications(id)
p head(p, 3)
## title
## 1 Quantum mechanics and path integration
## 2 The Feynman lectures on physics
## 3 TheFeynman lectures on physics
## author
## 1 RP Feynman, AR Hibbs
## 2 RP Feynman, RB Leighton, M Sands, SB Treiman
## 3 RP Feynman, RB Leighton, M Sands, CA Heras, R Gómez, E Oelker, ...
## journal number cites year
## 1 McGraw–Hill 30948 1965
## 2 Physics Today 17, 45 17707 1964
## 3 Fondo Educativo Interamericano, cop. 17447 1971
## cid
## 1 14769952204323476283,12549707430555464374,17914366645132260192
## 2 14769952204323476283,15649786516955137750,9018562047232646150,13112633961799421939,3669163321259408309
## 3 14769952204323476283,14916754439012518946,3384894241901148750,10013291528877493387,6950149260037791747,2796131643738233855,44985079034195671,9597590102184001665,788740732818767427,6704149347623579050,2968587135607687418,16196770756402817702
## pubid
## 1 hMod-77fHWUC
## 2 u-x6o8ySG0sC
## 3 SP6oXDckpogC
Retrieving citation data
## Get his citation history, i.e. citations to his work in a given year
<- get_citation_history(id)
ct
## Plot citation trend
library(ggplot2)
ggplot(ct, aes(year, cites)) + geom_line() + geom_point()
Users can retrieve the citation history of a particular publication
with get_article_cite_history()
.
## The following publication will be used to demonstrate article citation history
as.character(p$title[1])
## [1] "Quantum mechanics and path integration"
## Get article citation history
<- get_article_cite_history(id, p$pubid[1])
ach
## Plot citation trend
ggplot(ach, aes(year, cites)) +
geom_segment(aes(xend = year, yend = 0), size=1, color='darkgrey') +
geom_point(size=3, color='firebrick')
Comparing scholars
You can compare the citation history of scholars by fetching data
with compare_scholars
.
# Compare Feynman and Stephen Hawking
<- c('B7vSqZsAAAAJ', 'qj74uXkAAAAJ')
ids
# Get a data frame comparing the number of citations to their work in
# a given year
<- compare_scholars(ids)
cs
## remove some 'bad' records without sufficient information
<- subset(cs, !is.na(year) & year > 1900)
cs ggplot(cs, aes(year, cites, group=name, color=name)) + geom_line() + theme(legend.position="bottom")
## Compare their career trajectories, based on year of first citation
<- compare_scholar_careers(ids)
csc ggplot(csc, aes(career_year, cites, group=name, color=name)) + geom_line() + geom_point() +
theme(legend.position=c(.2, .8))