library(tm)
## Loading required package: NLP
getReaders()
## [1] "readDOC" "readPDF"
## [3] "readPlain" "readRCV1"
## [5] "readRCV1asPlain" "readReut21578XML"
## [7] "readReut21578XMLasPlain" "readTabular"
## [9] "readTagged" "readXML"
getSources()
## [1] "DataframeSource" "DirSource" "URISource" "VectorSource"
## [5] "XMLSource" "ZipSource"
#install.packages("tidytext")
require(tidytext)
## Loading required package: tidytext
library(janeaustenr)
warp<-austen_books() #creating warp from austen_books()
Corpus1=VCorpus(VectorSource(warp), readerControl = list(language = "eng")) #using VectorSource & VCorpus
# we may inspect(Corpus1)
# We may call Summary(Corpus1)
Corpus1 <- tm_map(Corpus1, removePunctuation)
Corpus1 <- tm_map(Corpus1, removeNumbers)
Corpus1 <- tm_map(Corpus1, tolower)
Corpus1 <- tm_map(Corpus1, removeWords, stopwords("english"))
#install.packages("SnowballC")
library(SnowballC)
Corpus1 <- tm_map(Corpus1, stemDocument)
Corpus1 <- tm_map(Corpus1, stripWhitespace)
Corpus1 <- tm_map(Corpus1, PlainTextDocument)
dtm <- DocumentTermMatrix(Corpus1)
dtms <- removeSparseTerms(dtm, 0.2)
inspect(dtm[1,1:30])
## <<DocumentTermMatrix (documents: 1, terms: 30)>>
## Non-/sparse entries: 30/0
## Sparsity : 0%
## Maximal term length: 12
## Weighting : term frequency (tf)
##
## Terms
## Docs abandoned abashed abate abatement abating abbey abbeyfor
## character(0) 1 1 1 4 1 62 1
## Terms
## Docs abbeyland abbeymil abbeymill abbeyoh abbeys abbots
## character(0) 1 1 6 1 2 1
## Terms
## Docs abbreviation abdication abdys abhor abhorr abhorred
## character(0) 1 1 1 5 3 3
## Terms
## Docs abhorrence abhorrent abide abiding abilities ability able
## character(0) 8 2 4 1 26 2 290
## Terms
## Docs ableand ablehave ableshe ablest
## character(0) 1 1 1 1
# We may inspect(dtms[1,1:30])
tdm <- TermDocumentMatrix(Corpus1)
tdm
## <<TermDocumentMatrix (terms: 20363, documents: 2)>>
## Non-/sparse entries: 20373/20353
## Sparsity : 50%
## Maximal term length: 32
## Weighting : term frequency (tf)
(tdm[1:30,1])
## <<TermDocumentMatrix (terms: 30, documents: 1)>>
## Non-/sparse entries: 30/0
## Sparsity : 0%
## Maximal term length: 12
## Weighting : term frequency (tf)
matx1=as.matrix(tdm)
matx1[1:10]
## [1] 1 1 1 4 1 62 1 1 1 6
sort1=sort(rowSums(matx1),decreasing=T)
sort1[1:10]
## emma mansfield park pride prejudic sense
## 16987 15533 15501 13127 13033 12804
## sens persuas abbey northanger
## 12665 8335 7918 7889
di=data.frame(Word=names(sort1),Frequency=sort1)
di[1:10,]
## Word Frequency
## emma emma 16987
## mansfield mansfield 15533
## park park 15501
## pride pride 13127
## prejudic prejudic 13033
## sense sense 12804
## sens sens 12665
## persuas persuas 8335
## abbey abbey 7918
## northanger northanger 7889
#install.packages("wordcloud")
library(wordcloud)
## Loading required package: RColorBrewer
wordcloud(di$Word, di$Frequency, max.words=100,colors=brewer.pal(6, "Reds"))

wordcloud(di$Word, di$Frequency, max.words=100,colors=brewer.pal(6, "Dark2"))

wordcloud(di$Word, di$Frequency, max.words=1000,colors=brewer.pal(6, "Reds"))
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : emma could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sense could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : northanger could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : mansfield could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sens could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : persuas could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : prejudic could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : enjoyment could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : immediately could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : yesterday could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : seemed could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : one could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : judgment could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : trouble could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : honour could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : acquainted could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : attempt could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : former could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : desire could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : maam could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : consider could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : hope could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : looks could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : attentions could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : scarcely could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : quarter could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : close could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : highly could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : persuade could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : warmth could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : expectation could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : introduced could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : forward could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : express could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : joined could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sister could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : door could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : year could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : window could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : health could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : satisfied could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : lyme could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : upon could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : thoughts could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : spirits could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : necessity could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : kind could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : affection could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : support could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : elegant could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : allowed could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : martin could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : likely could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : chapter could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : useful could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : attention could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sight could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : satisfaction could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : reasonable could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : painful could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : tone could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : whenever could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : rooms could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : generally could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : coming could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pleasure could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : appeared could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : distress could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : good could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : concerned could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : something could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : knowing could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : right could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : carriage could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : difficulty could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : little could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : grant could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : taken could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : got could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : niece could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : attended could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : home could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : hour could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : hopes could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : happened could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : knowledge could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : continued could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : looking could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : surprise could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : solicitude could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : darcy could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : reading could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : matter could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : serious could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : present could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : everi could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : might could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : child could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : late could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pleased could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : circumstance could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : hearing could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : spoken could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : conversation could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : prevent could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : place could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : resolution could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : cheerful could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : allow could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : happy could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : found could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : added could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : receiving could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : street could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : else could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : behind could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : always could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : anoth could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : young could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : reflection could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : enjoy could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : today could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : death could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : thing could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : man could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : way could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : among could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : son could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : children could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : jane could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : without could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : delight could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : never could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : three could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : extremely could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : lucas could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : creature could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : friendship could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : complete could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : object could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : harriets could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : interesting could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : wished could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : face could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : word could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : astonishment could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : notice could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : person could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : returning could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : earnest could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : temper could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : humour could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : imagine could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : become could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : makes could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : slight could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : abbey could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : wishing could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : thank could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : much could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : mrs could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : promise could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : repeated could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : plain could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : avoid could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : quick could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : praise could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : laugh could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : disappointed could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : remained could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : meaning could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : charlotte could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : tilney could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : mother could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : therefore could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : natural could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : gentleman could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : style could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : going could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : dear could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : smith could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : constant could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : respectable could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : say could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : often could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pay could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : dress could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : disposition could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : servant could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pleasant could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : louisa could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : married could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : rest could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : suffering could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : whether could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : otherwise could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : understand could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : visit could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : times could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : uncle could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : doubt could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : income could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : promised could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : day could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : months could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : arrived could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sorry could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : moth could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : increased could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : used could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : determined could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : appear could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : elinor could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : take could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : acquaint could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : inclination could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : mine could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : walking could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : heard could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : hand could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : entered could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : edmund could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : paid could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : came could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : hartfield could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : intimacy could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : near could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : seem could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : others could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : fanny could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : following could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : russell could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : work could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : maria could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : james could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : ready could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : curiosity could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : spend could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : returned could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : bertrams could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : smiled could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : gratitude could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : length could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : led could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : susan could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : loss could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : considered could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : musgrove could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : talking could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : whole could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : difference could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : knightley could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : ground could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : service could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : decided could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : answered could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : hoped could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : usual could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : soon could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : keep could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : admiral could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : silence could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : speech could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : high could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : reason could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : come could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : years could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : small could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : mention could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : received could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : smallest could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pain could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : fairfax could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : absence could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : met could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : suffered could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : book could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : dinner could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : middleton could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : netherfield could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : latter could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : impossible could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : perfectly could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : disappointment could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : back could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : short could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : invitation could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : distance could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : subject could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : poor could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : nearly could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : regret could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : replied could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : open could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : half could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : judge could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : farther could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : expressed could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : world could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : told could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : happiness could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : saw could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : silent could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : brothers could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : wickham could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : endeavour could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : formed could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : longer could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sisters could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : longbourn could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : hours could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : given could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : yet could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : beautiful could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : cousins could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : expect could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : spent could not be fit on page. It will not be plotted.

wordcloud(di$Word, di$Frequency, max.words=1000,colors=brewer.pal(6, "Dark2"))
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : emma could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : northanger could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sense could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : seriously could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : information could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : thinking could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : saying could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : confess could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : whole could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : cottage could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : minute could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : happi could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : least could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : cheerful could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : catherines could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : park could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : last could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : jennings could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : altogether could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : husband could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : good could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : particulars could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : enough could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : forward could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : may could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : anoth could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : attend could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : already could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : excellent could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : absolutely could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : together could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : appear could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : humour could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : directly could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : period could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : morland could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : knows could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : advantage could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : letters could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : means could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : honour could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : quiet could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : since could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : anybody could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : purpose could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : especially could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : entered could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : intimacy could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : book could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : appeared could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : reasonable could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : determined could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : maam could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : common could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : within could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : excuse could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : ease could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : note could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : attended could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : making could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : tried could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : knowing could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : knew could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : expectation could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : difficulty could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : countenance could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : done could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : astonishment could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : eyes could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : twenty could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : side could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : poor could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : wanted could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : whenever could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : placed could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : quite could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : love could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : made could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sensible could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : little could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : importance could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : forced could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : actually could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : speaking could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : mother could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : great could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : servants could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : others could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : judgment could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : secure could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : superior could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : except could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : point could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : knowledge could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : praise could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : feelings could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : cause could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : speak could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : angry could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : frank could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : necessary could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : taking could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : long could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : assure could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : nearly could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : invitation could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : yesterday could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : two could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pounds could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : paid could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : believed could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : admiral could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : terms could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : fact could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : attentions could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : question could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : beauty could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pleasure could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : occasion could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : anxiety could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : express could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : claims could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : stood could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : perfect could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : idea could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : longer could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : thorpe could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : comes could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : intended could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : noth could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : edmund could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : credit could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : hard could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : getting could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : isabella could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : struck could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : year could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : otherwise could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : william could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : passed could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : window could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : proof could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : attempt could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : randalls could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : eager could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : extraordinary could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : friendship could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sure could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : doubt could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : norris could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sometimes could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : happy could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pleased could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : power could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : eye could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : spoke could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : uppercross could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : following could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : girls could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : easily could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : fanny could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : fairfax could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : become could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : will could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : obliged could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : captain could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : looks could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : happen could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : increased could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : enjoy could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : possibility could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : assured could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : reason could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : difference could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : john could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : stay could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : everything could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : thing could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : declared could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : disappointment could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : wished could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : ready could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : dance could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : highly could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : respectable could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : farther could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : towards could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : avoid could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : middleton could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : mention could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : received could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : acquaintance could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : concern could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : receiving could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pain could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : prospect could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : harriet could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : smiled could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : exactly could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : consent could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : smallest could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : impossible could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : better could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : admiration could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : crawford could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : equally could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : justice could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : suppose could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : brothers could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : chance could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : going could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : expected could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : opinion could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : hopes could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : say could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : servant could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : gratitude could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : past could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : back could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : rooms could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : offer could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : expect could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pity could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : listen could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sight could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : seeing could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pres could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : absence could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : dear could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : vanity could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : still could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : income could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : word could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : prejudic could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : forgotten could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : kindness could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sisters could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : encouragement could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : first could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : time could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : reached could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : besides could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : night could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : equal could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : used could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : left could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : right could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : affection could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : soon could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : children could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pleasing could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : seat could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : pleasant could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : miles could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : standing could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : evening could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : ground could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : play could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : sudden could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : mind could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : henry could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : deal could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : indeed could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : tears could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : gentlemen could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : willoughby could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : netherfield could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : suffered could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : meet could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : business could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : fath could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : fortune could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : concerned could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : visit could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : hardly could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : madam could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : acknowledged could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : see could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : difficulties could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : disposition could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : ball could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : well could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : lyme could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : consequence could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : mad could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : attached could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : early could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : given could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : observation could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : name could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : length could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : mansfield could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : part could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : talking could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : misery could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : afterwards could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : behaviour could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : invited could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : effect could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : price could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : lydia could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : service could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : particular could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : joined could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : therefore could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : bear could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : near could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : recollect could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : present could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : ever could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : hour could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : musgrove could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : mistaken could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : expressed could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : supposed could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : welcome could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : trouble could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : breakfast could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : answer could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : strange could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : gardiner could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : likely could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : gone could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : martin could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : affect could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : delight could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : tomorrow could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : seem could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : probably could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : half could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : light could not be fit on page. It will not be plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors
## = brewer.pal(6, : acquainted could not be fit on page. It will not be
## plotted.
## Warning in wordcloud(di$Word, di$Frequency, max.words = 1000, colors =
## brewer.pal(6, : brought could not be fit on page. It will not be plotted.
