1 Titles and Abstracts

1.1 Titles

## [1] 3922    3
## 
## 2005 2006 2007 2008 2009 2010 2011 2012 2013 2014 2015 2016 2017 2018 2019 2020 
##   10   22  119  480  177  233  227  223  474  326  278  321  297  257  427   51
## [1] 1631    3

1.2 Abstracts

stopwords_regex = paste(stopwords('en'), collapse = '\\b|\\b')
stopwords_regex = paste0('\\b', stopwords_regex, '\\b')
tip03$abstract1 = stringr::str_replace_all(tip03$abstract, stopwords_regex, '')


trigram <- tip03 %>%
  unnest_tokens(trigram, abstract1, token = "ngrams", n = 3) %>%
  count(trigram, sort = TRUE)
datatable(trigram)
## Warning in instance$preRenderHook(instance): It seems your data is too big
## for client-side DataTables. You may consider server-side processing: https://
## rstudio.github.io/DT/server.html
tetragram<- tip03 %>%
  unnest_tokens(trigram, abstract1, token = "ngrams", n = 4) %>%
  count(trigram, sort = TRUE)
datatable(tetragram)
## Warning in instance$preRenderHook(instance): It seems your data is too big
## for client-side DataTables. You may consider server-side processing: https://
## rstudio.github.io/DT/server.html