Attribution: This workshop was inspired by and/or modified in part from Text Mining with R by Julia Silge and David Robinson..
Most of the data we’ve dealt with so far in this course has been rectangular, in the form of a data frame or tibble, and mostly numeric. But lots of data these days comes in the form of unstructured text. This workshop provides an overview of fundamental principles in text mining, and introduces the tidytext package that allows you to apply to text data the same “tidy” methods you’re familiar with for wrangling and vizualizing data.
Course pre-requisites:
This course is not an extensive deep dive into natural language processing (NLP). For that check out the CRAN task view on NLP for a long list of packages that will aid you in computational linguistics.
Before we get started, let’s load the packages we’ll need.
library(tidyverse)
library(tidytext)
library(gutenbergr)
library(topicmodels)
In the previous lessons linked above we discussed the three features of Tidy Data, as outlined in Hadley Wickham’s Tidy Data paper:
Tidy text format can be defined as a table with one-token-per-row. A token is any meaningful unit of text, such as a word, that we are interested in using for analysis. Tokenization is the process of splitting text into tokens. This is in contrast to storing text in strings or in a document-term matrix (discussed later). Here, the token stored in a single row is most often a single word. The tidytext package provides functionality to tokenize strings by words (or n-grams, or sentences) and convert to a one-term-per-row format. By keeping text in “tidy” tables, you can use the normal tools you’re familiar with, including dplyr, tidyr, ggplot2, etc., for manipulation, analysis, and visualization. The tidytext package also includes functions to convert to and from other data structures for text processing, such as a corpus1 or a document-term matrix.2
unnest_tokens
functionWe briefly mentioned before how to create vectors using the c()
function. Let’s create a simple character vector.
text <- c("a", "banana", "crouton")
Let’s extend that to create another character vector, this time with sentences:
text <- c("It was the best of times,",
"it was the worse of times,",
"It was the spring of hope, it was the winter of despair.")
text
Before we can turn this into a tidy text dataset, we first have to put it in a data frame.
text_df <- data_frame(line = 1:3, text = text)
text_df
## # A tibble: 3 x 2
## line text
## <int> <chr>
## 1 1 It was the best of times,
## 2 2 it was the worse of times,
## 3 3 It was the spring of hope, it was the winter of despair.
This data isn’t yet “tidy.” We can’t do the kinds of operations like filter out particular words or summarize operations, for instance, to count which occur most frequently, since each row is made up of multiple combined words. We need to convert this so that it has one-token-per-document-per-row. Here we only have a single document, but later we’ll have multiple documents.
We need to (1) break the text into individual tokens (i.e. tokenization) and transform it to a tidy data structure. To do this, we use tidytext’s unnest_tokens()
function.
text_df %>%
unnest_tokens(output=word, input=text)
## # A tibble: 24 x 2
## line word
## <int> <chr>
## 1 1 it
## 2 1 was
## 3 1 the
## 4 1 best
## 5 1 of
## 6 1 times
## 7 2 it
## 8 2 was
## 9 2 the
## 10 2 worse
## # ... with 14 more rows
The unnest_tokens
function takes a data frame (or tibble), and two additional parameters, the output
and input
column names. If you specify them in the correct order, you don’t have to specify output=
or input=
. You can pipe to print(n=Inf)
to print them all.
text_df %>%
unnest_tokens(word, text) %>%
print(n=Inf)
First you give it the output column name that will be created as the text is unnested into it (word
, in this example). This is a column name that you choose – you could call it anything, but word
usually makes sense. Then you give it the input column that the text comes from in the data frame you’re passing to it (text
, in this case). Our text_df
dataset has a column called text
that contains the data of interest.
The unnest_tokens
function splits each row so that there is one word per row of the new data frame; the default tokenization in unnest_tokens()
is for single words, as shown here. Also notice:
unnest_tokens()
converts the tokens to lowercase, which makes them easier to compare or combine with other datasets. (Use the to_lower = FALSE
argument to turn off this behavior).Now our data is in a tidy format, and we can easily use all the normal dplyr, tidyr, and ggplot2 tools.
Let’s load the austen.csv data.
jaorig <- read_csv("data/austen.csv")
jaorig
Click the jaorig
dataset in the environment pane or use View(jaorig)
to see what’s being read in here. Before we can do anything else we’ll need to tidy this up by unnesting the text
column into words.
jatidy <- jaorig %>%
unnest_tokens(word, text)
jatidy
Let’s use the dplyr count
function to count how many occurances we have for each word in the entire corpus. The sort=TRUE
option puts the most common results on top.
jatidy %>%
count(word, sort = TRUE)
Not surprisingly the most common words are some of the most commonly used words in the English language. These are known as stop words. They’re words you’ll want to filter out before doing any text mining. There are lists of stop words online, but the tidytext package comes with a stop_words
built-in dataset with some of the most common stop words across three different lexicons. See ?stop_words
for more information.
data(stop_words)
stop_words
As in a previous lesson where we did an inner_join
to link information across two different tables by a common key, there’s also an anti_join()
which takes two tibbles, x and y, and returns all rows from x where there are not matching values in y, keeping just columns from x. Let’s anti_join
the data to the stop words. Because we chose “word” as the output variable to unnest_tokens()
, and “word” is the variable in the stop_words
dataset, we don’t have to be specific about which columns we’re joining.
jatidy %>%
anti_join(stop_words)
Now there are far fewer rows than initially present. Let’s run that count again, now with the stop words removed.
jatidy %>%
anti_join(stop_words) %>%
count(word, sort = TRUE)
## # A tibble: 13,914 x 2
## word n
## <chr> <int>
## 1 miss 1855
## 2 time 1337
## 3 fanny 862
## 4 dear 822
## 5 lady 817
## 6 sir 806
## 7 day 797
## 8 emma 787
## 9 sister 727
## 10 house 699
## # ... with 13,904 more rows
That’s much more in line with what we want. We have this data in a tibble. Let’s keep piping to other operations!
jatidy %>%
anti_join(stop_words) %>%
count(word, sort = TRUE) %>%
head(20) %>%
mutate(word = reorder(word, n)) %>%
ggplot(aes(word, n)) +
geom_col() +
coord_flip()
Let’s start to do some high-level analysis of the text we have. Sentiment analysis3, also called opinion mining, is the use of text mining to “systematically identify, extract, quantify, and study affective states and subjective information.” It’s a way to try to understand the emotional intent of words to infer whether a section of text is positive or negative, or perhaps characterized by some other more nuanced emotion like surprise or disgust.
If you make a simplifying assumption regarding the text you have as a combination of its individual words, you can treat the sentiment content of the whole text as the sum of the sentiment content of the individual words. It’s a simplification, and it isn’t the only way to approach sentiment analysis, but it’s simple and easy to do with tidy principles.
To get started you’ll need a sentiment lexicon that attempt to evaluate the opinion or emotion in text. The tidytext package contains several sentiment lexicons in the sentiments
dataset. All three of these lexicons are based on single words in the English language, assigning scores for positive/negative sentiment, or assigning emotions like joy, anger, sadness, etc.
nrc
from Saif Mohammad and Peter Turney4 categorizes words in a binary fashion (“yes”/“no”) into categories of positive, negative, anger, anticipation, disgust, fear, joy, sadness, surprise, and trust.bing
from Bing Liu and collaborators5 categorizes words in a binary fashion into positive and negative categories.AFINN
from Finn Arup Nielsen6 assigns words with a score that runs between -5 and 5, with negative scores indicating negative sentiment and positive scores indicating positive sentiment.The built-in sentiments
dataset available when you load the tidytext package contains all of this information. You could filter it to a single lexicon with the dplyr filter()
function, or use tidytext’s get_sentiments()
to get specific sentiment lexicons containing only the data used for that lexicon.
# Look at the sentiments data
data(sentiments)
sentiments
sentiments %>% filter(lexicon=="nrc")
sentiments %>% filter(lexicon=="bing")
sentiments %>% filter(lexicon=="AFINN")
# Use the built-in get_sentiments() function
get_sentiments("nrc")
get_sentiments("bing")
get_sentiments("afinn")
There are a few major caveats to be aware of.
Let’s look at the most common joy words in Emma. To do this we will:
jatidy %>%
inner_join(get_sentiments("nrc")) %>%
filter(sentiment=="joy") %>%
filter(book=="Emma") %>%
count(word, sort=TRUE)
## # A tibble: 303 x 2
## word n
## <chr> <int>
## 1 good 359
## 2 young 192
## 3 friend 166
## 4 hope 143
## 5 happy 125
## 6 love 117
## 7 deal 92
## 8 found 92
## 9 present 89
## 10 kind 82
## # ... with 293 more rows
Try running the same code but replacing “joy” with “anger” or “trust.”
jatidy %>%
inner_join(get_sentiments("nrc")) %>%
filter(sentiment=="anger") %>%
filter(book=="Emma") %>%
count(word, sort=TRUE)
Let’s look at how sentiment changes over time throughout each novel.
%/%
operator does integer division. It tells you the integer quotient without the remainder. This is a way for us to keep track of which 80-line section of text we are counting up negative and positive sentiment in.jatidy %>%
inner_join(get_sentiments("bing")) %>%
mutate(section=linenumber %/% 80) %>%
count(book, section, sentiment) %>%
spread(sentiment, n, fill=0) %>%
mutate(sentiment=positive-negative)
## # A tibble: 920 x 5
## book section negative positive sentiment
## <chr> <dbl> <dbl> <dbl> <dbl>
## 1 Emma 0 31 43 12
## 2 Emma 1 28 33 5
## 3 Emma 2 30 35 5
## 4 Emma 3 27 51 24
## 5 Emma 4 23 46 23
## 6 Emma 5 25 50 25
## 7 Emma 6 25 47 22
## 8 Emma 7 27 63 36
## 9 Emma 8 21 47 26
## 10 Emma 9 11 40 29
## # ... with 910 more rows
Now let’s pipe that whole thing to ggplot2 to see how the sentiment changes over the course of each novel. Facet by book, and pass scales="free_x"
so the x-axis is filled for each panel.
jatidy %>%
inner_join(get_sentiments("bing")) %>%
mutate(section=linenumber %/% 80) %>%
count(book, section, sentiment) %>%
spread(sentiment, n, fill=0) %>%
mutate(sentiment=positive-negative) %>%
ggplot(aes(section, sentiment)) +
geom_col() +
facet_wrap(~book, ncol = 2, scales = "free_x")
Try comparing different sentiment lexicons. You might see different results! Different lexicons contain different ratios of positive to negative sentiment words, and thus will give you different results. You would probably want to try a few different lexicons using a known dataset to see what lexicon is most appropriate for your purpose. For more information on this topic, see section 2.3 of the Tidy Text Mining book.
We could also analyze word counts that contribute to each sentiment. This first joins Jane Austen’s tidy text data to the bing lexicon and counts how many times each word-sentiment linkage exists.
jatidy %>%
inner_join(get_sentiments("bing")) %>%
count(word, sentiment, sort=TRUE)
## # A tibble: 2,585 x 3
## word sentiment n
## <chr> <chr> <int>
## 1 miss negative 1855
## 2 well positive 1523
## 3 good positive 1380
## 4 great positive 981
## 5 like positive 725
## 6 better positive 639
## 7 enough positive 613
## 8 happy positive 534
## 9 love positive 495
## 10 pleasure positive 462
## # ... with 2,575 more rows
Look at the help for ?top_n
. It’s similar to arranging a dataset then using head
to get the first few rows. But if we want the top n from each group, we need the top_n
function. Let’s continue the pipeline above.
top_n
function leaves the dataset grouped. In this case we want to ungroup the data.jatidy %>%
inner_join(get_sentiments("bing")) %>%
count(word, sentiment, sort=TRUE) %>%
group_by(sentiment) %>%
top_n(10) %>%
ungroup() %>%
mutate(word=reorder(word, n)) %>%
ggplot(aes(word, n)) +
geom_col(aes(fill=sentiment)) +
facet_wrap(~sentiment, scale="free_y") +
coord_flip()
Notice that “miss” is probably erroneous here. It’s used as a title for unmarried women in Jane Austen’s works, and should probably be excluded from analysis. You could filter this, or you could create a custom stop words lexicon and add this to it. You could also unnest the corpus using bigrams instead of single words, then filter to look for bigrams that start with “miss,” counting to show the most common ones.
jaorig %>%
unnest_tokens(bigram, text, token="ngrams", n=2) %>%
filter(str_detect(bigram, "^miss")) %>%
count(bigram, sort=TRUE)
## # A tibble: 169 x 2
## bigram n
## <chr> <int>
## 1 miss crawford 196
## 2 miss woodhouse 143
## 3 miss fairfax 98
## 4 miss bates 92
## 5 miss tilney 74
## 6 miss bingley 67
## 7 miss dashwood 55
## 8 miss bennet 52
## 9 miss morland 50
## 10 miss smith 48
## # ... with 159 more rows
In text mining we’re trying to get at “what is this text about?” We can start to get a sense of this by looking at the words that make up the text, and we can start to measure measure how important a word is by its term frequency (tf), how frequently a word occurs in a document. When we did this we saw some common words in the English language, so we took an approach to filter out our data first by a list of common stop words.
jatidy %>%
anti_join(stop_words) %>%
count(word, sort=TRUE)
Another way is to look at a term’s inverse document frequency (idf), which decreases the weight for commonly used words and increases the weight for words that are not used very much in a collection of documents. It’s defined as:
\[idf(\text{term}) = \ln{\left(\frac{n_{\text{documents}}}{n_{\text{documents containing term}}}\right)}\]
If you multiply the two values together, you get the tf-idf7, which is the frequency of a term adjusted for how rarely it is used. The tf-idf measures how important a word is to a document in a collection (or corpus) of documents, for example, to one novel in a collection of novels or to one website in a collection of websites.
We want to use tf-idf to find the important words for the content of each document by decreasing the weight for common words and increasing the weight for words that are not used very much in a corpus of documents (in this case, the group of Jane Austen’s novels). Calculating tf-idf attempts to find the words that are important (i.e., common) in a text, but not too common.
You could do this all manually, but there’s a nice function in the tidytext package called bind_tf_idf
that does this for you. It takes a tidy text dataset as input with one row per word, per document. One column (word
here) contains the terms/tokens, one column contains the documents (book
in this case), and the last necessary column contains the counts, how many times each document contains each term (n
in this example).
Let’s start by counting the number of occurances of each word in each book:
jatidy %>%
count(book, word, sort=TRUE)
Then we simply pipe that to the bind_tf_idf
function, giving it the column names for the word, document, and count column (word
, book
, and n
here):
jatidy %>%
count(word, book, sort=TRUE) %>%
bind_tf_idf(word, book, n)
You’ll see that the idf (and the tf-idf) are zero for really common words. These are all words that appear in all six of Jane Austen’s novels, so the idf is zero. This is how this approach decreases the weight for common words. The inverse document frequency will be a higher number for words that occur in fewer of the documents in the collection. Let’s arrange descending by tf-idf (tf_idf
with an underscore).
jatidy %>%
count(word, book, sort=TRUE) %>%
bind_tf_idf(word, book, n) %>%
arrange(desc(tf_idf))
## # A tibble: 40,379 x 6
## word book n tf idf tf_idf
## <chr> <chr> <int> <dbl> <dbl> <dbl>
## 1 elinor Sense & Sensibility 623 0.00519 1.79 0.00931
## 2 marianne Sense & Sensibility 492 0.00410 1.79 0.00735
## 3 crawford Mansfield Park 493 0.00307 1.79 0.00551
## 4 darcy Pride & Prejudice 373 0.00305 1.79 0.00547
## 5 elliot Persuasion 254 0.00304 1.79 0.00544
## 6 emma Emma 786 0.00488 1.10 0.00536
## 7 tilney Northanger Abbey 196 0.00252 1.79 0.00452
## 8 weston Emma 389 0.00242 1.79 0.00433
## 9 bennet Pride & Prejudice 294 0.00241 1.79 0.00431
## 10 wentworth Persuasion 191 0.00228 1.79 0.00409
## # ... with 40,369 more rows
No surprise - we see all proper nouns, names that are important for each novel. None of them occur in all of novels, and they are important, characteristic words for each text within the entire corpus of Jane Austen’s novels. Let’s visualize this data!
jatidy %>%
count(word, book, sort=TRUE) %>%
bind_tf_idf(word, book, n) %>%
arrange(desc(tf_idf)) %>%
group_by(book) %>%
top_n(15) %>%
ungroup %>%
mutate(word=reorder(word, tf_idf)) %>%
ggplot(aes(word, tf_idf)) +
geom_col() +
labs(x = NULL, y = "tf-idf") +
facet_wrap(~book, ncol = 2, scales = "free") +
coord_flip()
Project Gutenberg (https://www.gutenberg.org/) is a collection of freely available books that are in the public domain. You can get most books in all kinds of different formats (plain text, HTML, epub/kindle, etc). The gutenbergr package includes tools for downloading books (and stripping header/footer information), and a complete dataset of Project Gutenberg metadata that can be used to find words of interest. Includes:
gutenberg_download()
that downloads one or more works from Project Gutenberg by ID: e.g., gutenberg_download(84)
downloads the text of Frankenstein.gutenberg_metadata
contains information about each work, pairing Gutenberg ID with title, author, language, etcgutenberg_authors
contains information about each author, such as aliases and birth/death yeargutenberg_subjects
contains pairings of works with Library of Congress subjects and topicsLet’s use a different corpus of documents, to see what terms are important in a different set of works. Let’s download some classic science texts from Project Gutenberg and see what terms are important in these works, as measured by tf-idf. We’ll use three classic physics texts, and a classic Darwin text. Let’s use:
These might all be physics classics, but they were written across a 300-year timespan, and some of them were first written in other languages and then translated to English.
library(gutenbergr)
sci <- gutenberg_download(c(37729, 14725, 13476, 1228), meta_fields = "author")
Now that we have the texts, let’s use unnest_tokens()
and count()
to find out how many times each word was used in each text. Let’s assign this to an object called sciwords
. Let’s go ahead and add the tf-idf also.
scitidy <- sci %>%
unnest_tokens(word, text)
sciwords <- scitidy %>%
count(word, author, sort = TRUE) %>%
bind_tf_idf(word, author, n)
sciwords
## # A tibble: 16,992 x 6
## word author n tf idf tf_idf
## <chr> <chr> <int> <dbl> <dbl> <dbl>
## 1 the Darwin, Charles 10287 0.0656 0 0
## 2 of Darwin, Charles 7849 0.0501 0 0
## 3 and Darwin, Charles 4439 0.0283 0 0
## 4 in Darwin, Charles 4016 0.0256 0 0
## 5 the Galilei, Galileo 3760 0.0935 0 0
## 6 to Darwin, Charles 3605 0.0230 0 0
## 7 the Tesla, Nikola 3604 0.0913 0 0
## 8 the Huygens, Christiaan 3553 0.0928 0 0
## 9 a Darwin, Charles 2470 0.0158 0 0
## 10 that Darwin, Charles 2083 0.0133 0 0
## # ... with 16,982 more rows
Now let’s do the same thing we did before with Jane Austen’s novels:
sciwords %>%
group_by(author) %>%
top_n(15) %>%
ungroup() %>%
mutate(word=reorder(word, tf_idf)) %>%
ggplot(aes(word, tf_idf)) +
geom_col() +
labs(x = NULL, y = "tf-idf") +
facet_wrap(~author, ncol = 2, scales = "free") +
coord_flip()
We see some weird things here. We see “fig” for Tesla, but I doubt he was writing about a fruit tree. We see things like ab, ac, rc, etc for Huygens – these are names of rays and angles, etc. We could create a custom stop words dictionary to remove these. Let’s create a stop words data frame, then anti join that before plotting.
mystopwords <- data_frame(word=c("ab", "ac", "rc", "cm", "cg", "cb", "ak", "bn", "fig"))
sciwords %>%
anti_join(mystopwords) %>%
group_by(author) %>%
top_n(15) %>%
ungroup() %>%
mutate(word=reorder(word, tf_idf)) %>%
ggplot(aes(word, tf_idf)) +
geom_col() +
labs(x = NULL, y = "tf-idf") +
facet_wrap(~author, ncol = 2, scales = "free") +
coord_flip()
Topic modeling8 is a method for unsupervised classification of such documents, similar to clustering on numeric data, which finds natural groups of items even when we’re not sure what we’re looking for. It’s a way to find abstract “topics” that occur in a collection of documents, and it’s frequently used to find hidden semantic structures in a text body. Topic models can help us understand large collections of unstructured text bodies. In addition to text mining tasks like what we’ll do here, topic models have been used to detect useful structures in data such as genetic information, images, and networks, and have also been used in bioinformatics.9
Latent Dirichlet Allocation10 is one of the most common algorithms used in topic modeling. LDA treats each document as a mixture of topics, and each topic as a mixture of words:
LDA attempts to estimate both of these at the same time: finding words associated with each topic, while simutaneously determining the mixture of topics that describes each document.
Before we can get started in topic modeling we need to take a look at another common format for storing text data that’s not the tidy one-token-per-document-per-row format we’ve used so far (what we get from unnest_tokens
). Another very common structure that’s used by other text mining packages (such as tm or quanteda) is the document-term matrix11 (DTM). This is a matrix where:
Since most pairings of document and term do not occur (they have the value zero), DTMs are usually implemented as sparse matrices. These objects can be treated as though they were matrices (for example, accessing particular rows and columns), but are stored in a more efficient format. DTM objects can’t be used directly with tidy tools, just as tidy data frames can’t be used as input for other text mining packages. The tidytext package provides two verbs that convert between the two formats.
tidy()
turns a DTM into a tidy data frame. This verb comes from the broom package.cast()
turns a tidy one-term-per-row data frame into a matrix. tidytext provides three variations of this verb, each converting to a different type of matrix:
cast_sparse()
: converts to a sparse matrix from the Matrix package.cast_dtm()
: converts to a DocumentTermMatrix
object from tm.cast_dfm()
: converts to a dfm
object from quanteda.First let’s load the AssociatedPress
data from the topicmodels package. Take a look. We can see that the AssociatedPress
data is a DTM with 2,246 documents (AP articles from 1988) and 10,473 terms. The 99% sparsity indicates that the matrix is almost complete made of zeros, i.e., almost all the document-term pairs are zero – most terms are not used in most documents. If we want to use the typical tidy tools we’ve used above, we’ll use the tidy()
function to melt this matrix into a tidy one-token-per-document-per-row format. Notice that this only returns the 302,031 non-zero entries.
library(topicmodels)
data(AssociatedPress)
AssociatedPress
tidy(AssociatedPress)
First let’s use the LDA()
function from the topicmodels package, setting k = 2
, to create a two-topic LDA model. This function returns an object containing the full details of the model fit, such as how words are associated with topics and how topics are associated with documents. Fitting the model is easy. For the rest of this section we’ll be exploring and interpreting the model.
# set a seed so that the output of the model is predictable
ap_lda <- LDA(AssociatedPress, k = 2, control=list(seed=1234))
ap_lda
Displaying the model itself, ap_lda
isn’t that interesting. The tidytext package provides a tidy
method for extracting the per-topic-per-word probabilities, called \(\beta\) (“beta”), from the model.
ap_topics <- tidy(ap_lda, matrix = "beta")
ap_topics
## # A tibble: 20,946 x 3
## topic term beta
## <int> <chr> <dbl>
## 1 1 aaron 1.69e-12
## 2 2 aaron 3.90e- 5
## 3 1 abandon 2.65e- 5
## 4 2 abandon 3.99e- 5
## 5 1 abandoned 1.39e- 4
## 6 2 abandoned 5.88e- 5
## 7 1 abandoning 2.45e-33
## 8 2 abandoning 2.34e- 5
## 9 1 abbott 2.13e- 6
## 10 2 abbott 2.97e- 5
## # ... with 20,936 more rows
This returns a one-topic-per-term-per-row format. For each combination, the model computes the probability of that term being generated from that topic. For example, the term “aaron” has a \(1.687\times 10^{-12}\) probability of being generated from topic 1, but a \(3.896\times 10^{-5}\) probability of being generated from topic 2.
We could use dplyr’s top_n()
to find the 10 terms that are most common within each topic. Because this returns a tidy data frame, we could easily continue piping to ggplot2.
# What are the top words for each topic?
ap_topics %>%
group_by(topic) %>%
top_n(10) %>%
ungroup() %>%
arrange(topic, desc(beta))
# Continue piping to ggplot2
ap_topics %>%
group_by(topic) %>%
top_n(10) %>%
ungroup() %>%
arrange(topic, desc(beta)) %>%
mutate(term = reorder(term, beta)) %>%
ggplot(aes(term, beta)) +
geom_col() +
facet_wrap(~topic, scales = "free") +
coord_flip()
This visualization lets us understand the two topics that were extracted from the articles. Common words in topic 1 include “percent”, “million”, “billion”, and “company”. Perhaps topic 1 represents business or financial news. Common in topic 2 include “president”, “government”, and “soviet”, suggeting that this topic represents political news. Note that some words, such as “new” and “people”, are common within both topics. This is an advantage (as opposed to “hard clustering” methods): topics used in natural language could have some overlap in terms of words.
Let’s look at the terms that had the greatest difference in \(\beta\) between topic 1 and topic 2. This can be estimated based on the log ratio of the two: \(\log_2(\frac{\beta_2}{\beta_1})\) (a log ratio is useful because it makes the difference symmetrical: \(\beta_2\) being twice as large leads to a log ratio of 1, while \(\beta_1\) being twice as large results in -1). To constrain it to a set of especially relevant words, we can filter for relatively common words, such as those that have a \(\beta\) greater than 1/1000 in at least one topic.
First let’s turn 1
and 2
into topic1
and topic2
so that after the spread
we’ll easily be able to work with those columns.
ap_topics %>%
mutate(topic = paste0("topic", topic)) %>%
spread(topic, beta) %>%
filter(topic1 > .001 | topic2 > .001) %>%
mutate(log_ratio = log2(topic2 / topic1))
We could continue piping to ggplot2. First, let’s create a new variable we’ll group on, which is the direction of imbalance. We’ll also create a variable showing the absolute value of the log ratio, which is a directionless value indicating the magnitude of the effect. This lets us select the top 10 terms most associated with either topic1 or topic2.
ap_topics %>%
mutate(topic = paste0("topic", topic)) %>%
spread(topic, beta) %>%
filter(topic1 > .001 | topic2 > .001) %>%
mutate(log_ratio = log2(topic2 / topic1)) %>%
mutate(direction = (log_ratio>0)) %>%
mutate(absratio=abs(log_ratio)) %>%
group_by(direction) %>%
top_n(10) %>%
ungroup() %>%
mutate(term = reorder(term, log_ratio)) %>%
ggplot(aes(term, log_ratio)) +
geom_col() +
labs(y = "Log2 ratio of beta in topic 2 / topic 1") +
coord_flip()
We can see that the words more common in topic 2 include political parties such as “democratic” and “republican”, as well as politician’s names such as “dukakis” and “gorbachev”. Topic 1 was more characterized by currencies like “yen” and “dollar”, as well as financial terms such as “index”, “prices” and “rates”. This helps confirm that the two topics the algorithm identified were political and financial news.
Above we estimated the per-topic-per-word probabilities, \(\beta\) (“beta”). LDA also models each document as a mixture of topics. Let’s look at the per-document-per-topic probabilities, \(\gamma\) (“gamma”), with the matrix = "gamma"
argument to tidy()
.
ap_documents <- tidy(ap_lda, matrix = "gamma")
ap_documents
## # A tibble: 4,492 x 3
## document topic gamma
## <int> <int> <dbl>
## 1 1 1 0.248
## 2 2 1 0.362
## 3 3 1 0.527
## 4 4 1 0.357
## 5 5 1 0.181
## 6 6 1 0.000588
## 7 7 1 0.773
## 8 8 1 0.00445
## 9 9 1 0.967
## 10 10 1 0.147
## # ... with 4,482 more rows
These values represent the estimated proportion of words from that document that are generated from that topic. For example, the the model estimates only about 24.8% of the words in document 1 were generated from topic 1.
Most of these documents were drawn from a mix of the two topics, but document 6 was drawn almost entirely from topic 2, having a \(\gamma\) from topic 1 close to zero. To check this answer, we could tidy()
the document-term matrix.
tidy(AssociatedPress) %>%
filter(document == 6) %>%
arrange(desc(count))
## # A tibble: 287 x 3
## document term count
## <int> <chr> <dbl>
## 1 6 noriega 16
## 2 6 panama 12
## 3 6 jackson 6
## 4 6 powell 6
## 5 6 administration 5
## 6 6 economic 5
## 7 6 general 5
## 8 6 i 5
## 9 6 panamanian 5
## 10 6 american 4
## # ... with 277 more rows
Based on the most common words, this looks like an article about the relationship between the American government and Panamanian dictator Manuel Noriega, which means the algorithm was right to place it in topic 2 (as political/national news).
When examining a statistical method, it can be useful to try it on a very simple case where you know the “right answer”. For example, we could collect a set of documents that definitely relate to four separate topics, then perform topic modeling to see whether the algorithm can correctly distinguish the four groups. This lets us double-check that the method is useful, and gain a sense of how and when it can go wrong. We’ll try this with some data from classic literature.
Suppose a vandal has broken into your study and torn apart four of your books:
This vandal has torn the books into individual chapters, and left them in one large pile. How can we restore these disorganized chapters to their original books? This is a challenging problem since the individual chapters are unlabeled: we don’t know what words might distinguish them into groups. We’ll thus use topic modeling to discover how chapters cluster into distinct topics, each of them (presumably) representing one of the books.
We’ll retrieve the text of these four books using the gutenbergr package:
library(gutenbergr)
titles <- c("Twenty Thousand Leagues under the Sea",
"The War of the Worlds",
"Pride and Prejudice",
"Great Expectations")
books <- gutenberg_works(title %in% titles) %>%
gutenberg_download(meta_fields = "title")
You’ll want to start by dividing the books these into chapters, use tidytext’s unnest_tokens()
to separate them into words, then remove stop_words
. You’ll be treating every chapter as a separate “document”, each with a name like Great Expectations_1
or Pride and Prejudice_11
. You’ll cast this into a DTM then run LDA. You’ll look at the word-topic probabilities to try to get a sense of which topic represents which book, and you’ll use document-topic probabilities to assign chapters to their books. See section 6.2 of Tidy Text Mining for code and a walk-through.
Source: https://suzan.rbind.io/2018/02/happy-galentines-day/
This analysis does a tidy text mining analysis of several scripts from Parks and Recreation. In addition to the kinds of analyses we’ve performed here, it also illustrates some additional functionality for extracting text from PDF documents (the scripts were only available as PDFs).
Source: http://varianceexplained.org/r/op-ed-text-analysis/
In September 2018 the New York Times published an anonymous op-ed, “I Am Part of the Resistance Inside the Trump Administration”, written by a “senior official in the Trump administration”. Lots of data scientists tried to use text-mining techniques to determine who wrote this op-ed. This analysis compares the text of the op-ed to the set of documents representing “senior officials.” In addition to what we’ve covered here, this also covers scraping text from Twitter accounts, and methods for comparing TF-IDF vectors using cosine similarity, which was touched on in section 4.2 of Tidy Text Mining.
Source: https://pradeepadhokshaja.wordpress.com/2018/08/06/looking-at-seinfeld-dialogues-using-tidytext/
Data: https://www.kaggle.com/thec03u5/seinfeld-chronicles
This analysis uses the tidytext package to analyze the full text of the entire Seinfeld series that ran 1989-1998.
This analysis illustrates a tidytext approach to examine the use of sentiment words in the tragedies written by William Shakespeare.
Corpus objects contain strings annotated with additional metadata.↩
This is a (sparse) matrix describing a collection (corpus) of documents with one row for each document and one column for each term. The value in the matrix is typically word count or tf-idf for the document in that row for the term in that column.↩
http://www2.imm.dtu.dk/pubdb/views/publication_details.php?id=6010↩
Blei, David (April 2012). “Probabilistic Topic Models”. Communications of the ACM. 55 (4): 77-84. doi:10.1145/2133806.2133826↩