Alexander Matrunich
18 May 2017, R-Ladies Tbilisi
Specialist degree in sociology at Pskov Volny Institute
Free open source enthusiast (GNU/Linux, LibreOffice, etc.)
Open data contributor (Wikipedia, OpenStreetMap)
Notable projects with R:
Screenshoot by David Smith from Indeed Job Trends

Idea and plot by Gordon Shotwell
idbr package to get the US Census dataggplot2 package to visualizeggthemes package to apply The Economist styleanimation package to create gifSee David Smith's post for details and link to source code
See details in David Smith's post
read_csv('GEOSTAT_grid_POP_1K_2011_V2_0_1.csv') %>%
rbind(read_csv('JRC-GHSL_AIT-grid-POP_1K_2011.csv') %>%
mutate(TOT_P_CON_DT='')) %>%
mutate(lat = as.numeric(gsub('.*N([0-9]+)[EW].*', '\\1', GRD_ID))/100,
lng = as.numeric(gsub('.*[EW]([0-9]+)', '\\1', GRD_ID)) *
ifelse(gsub('.*([EW]).*', '\\1', GRD_ID) == 'W', -1, 1) / 100) %>%
filter(lng > 25, lng < 60) %>%
group_by(lat = round(lat, 1), lng = round(lng, 1)) %>%
summarize(value = sum(TOT_P, na.rm = TRUE)) %>%
ungroup() %>%
complete(lat, lng) %>%
ggplot(aes(lng, lat + 5*(value/max(value, na.rm = TRUE)))) +
geom_line(size = 0.4, alpha = 0.8, color='#5A3E37', aes(group=lat), na.rm=TRUE) +
ggthemes::theme_map() +
coord_equal(0.9)
See details in David Smith's post

A collage of profile pictures of people who use the #rstats hashtag in their Twitter bio.
Created with R!
rtweet package. httr package.magick package.See details in the original post by Maëlle Salmon and a description in David Smith's post.
See slides R Foundation Women in R Taskforce
1976 - S language in Bell Labs by John Chambers
1993 - R - open source implementation of S by Ross Ihaka and Robert Gentleman at the University of Auckland
1997 - CRAN; part of the GNU Project
2000 - Version 1.0, suitable for production use
2004 - Version 2.0
2013 - Version 3.0. Values 231
2016 - R-Ladies Tbilisi founded
Free open source RStudio IDE:
r, rstat, rlang, cran keywordshttps://insights.stackoverflow.com/trends?tags=r%2Cstatistics