#CITATION Rdatamining.com
getwd()
## [1] "C:/Users/dell/Desktop/Teaching"
rm(list=ls())
gc()
## used (Mb) gc trigger (Mb) max used (Mb)
## Ncells 293848 7.9 592000 15.9 350000 9.4
## Vcells 324251 2.5 786432 6.0 677529 5.2
sessionInfo()
## R version 3.2.2 (2015-08-14)
## Platform: i386-w64-mingw32/i386 (32-bit)
## Running under: Windows 7 (build 7601) Service Pack 1
##
## locale:
## [1] LC_COLLATE=English_United States.1252
## [2] LC_CTYPE=English_United States.1252
## [3] LC_MONETARY=English_United States.1252
## [4] LC_NUMERIC=C
## [5] LC_TIME=English_United States.1252
##
## attached base packages:
## [1] stats graphics grDevices utils datasets methods base
##
## loaded via a namespace (and not attached):
## [1] magrittr_1.5 tools_3.2.2 htmltools_0.3 stringi_1.0-1 rmarkdown_0.7
## [6] knitr_1.10.5 stringr_1.0.0 digest_0.6.8 evaluate_0.7
memory.limit()
## [1] 1535
library(tm)
## Loading required package: NLP
library(wordcloud)
## Loading required package: RColorBrewer
getSources()
## [1] "DataframeSource" "DirSource" "URISource" "VectorSource"
## [5] "XMLSource" "ZipSource"
getReaders()
## [1] "readDOC" "readPDF"
## [3] "readPlain" "readRCV1"
## [5] "readRCV1asPlain" "readReut21578XML"
## [7] "readReut21578XMLasPlain" "readTabular"
## [9] "readTagged" "readXML"
txt2="C:/Users/dell/Desktop/test"
#?Corpus
# Corpora are collections of documents
# containing (natural language) text.
# In packages which employ the infrastructure
# provided by package tm,
# such corpora are represented via the
# virtual S3 class Corpus:
b=Corpus(DirSource(txt2),
readerControl = list(language = "eng"))
b
## <<VCorpus>>
## Metadata: corpus specific: 0, document level (indexed): 0
## Content: documents: 1
inspect(b)
## <<VCorpus>>
## Metadata: corpus specific: 0, document level (indexed): 0
## Content: documents: 1
##
## [[1]]
## <<PlainTextDocument>>
## Metadata: 7
## Content: chars: 24
## Content: chars: 17
## Content: chars: 0
## Content: chars: 19
## Content: chars: 0
## Content: chars: 278
## Content: chars: 0
## Content: chars: 457
## Content: chars: 0
## Content: chars: 64
## Content: chars: 0
## Content: chars: 552
## Content: chars: 0
## Content: chars: 254
## Content: chars: 0
## Content: chars: 191
## Content: chars: 0
## Content: chars: 105
## Content: chars: 0
## Content: chars: 174
## Content: chars: 0
## Content: chars: 404
## Content: chars: 0
## Content: chars: 529
## Content: chars: 0
## Content: chars: 104
## Content: chars: 0
## Content: chars: 111
## Content: chars: 0
## Content: chars: 91
## Content: chars: 0
## Content: chars: 266
## Content: chars: 0
## Content: chars: 556
## Content: chars: 0
## Content: chars: 677
## Content: chars: 0
## Content: chars: 319
## Content: chars: 0
## Content: chars: 713
## Content: chars: 582
## Content: chars: 0
## Content: chars: 655
## Content: chars: 0
## Content: chars: 449
## Content: chars: 0
## Content: chars: 714
## Content: chars: 0
## Content: chars: 624
## Content: chars: 0
## Content: chars: 487
## Content: chars: 0
## Content: chars: 429
## Content: chars: 0
## Content: chars: 580
## Content: chars: 0
## Content: chars: 497
## Content: chars: 0
## Content: chars: 763
## Content: chars: 0
## Content: chars: 49
## Content: chars: 0
## Content: chars: 104
## Content: chars: 0
## Content: chars: 320
## Content: chars: 0
## Content: chars: 445
## Content: chars: 202
## Content: chars: 0
## Content: chars: 508
## Content: chars: 0
## Content: chars: 68
b <- tm_map(b, tolower)
# tm_map
# Interface to apply transformation functions
# (also denoted as mappings) to corpora.
# remove punctuation
b <- tm_map(b, removePunctuation)
# remove numbers
b <- tm_map(b, removeNumbers)
# remove stopwords
myStopwords <- c(stopwords('english'), "can")
b <- tm_map(b, removeWords, myStopwords)
b <- tm_map(b, stemDocument)
#run and running and ran
b <- tm_map(b, PlainTextDocument)
myDtm <- TermDocumentMatrix(b, control = list(minWordLength = 1))
inspect(myDtm)
## <<TermDocumentMatrix (terms: 810, documents: 1)>>
## Non-/sparse entries: 810/0
## Sparsity : 0%
## Maximal term length: 16
## Weighting : term frequency (tf)
##
## Docs
## Terms character(0)
## Â’ll 1
## abandoned 1
## ability 1
## accept 1
## account 1
## achieve 1
## across 3
## act 1
## action 1
## address 1
## advance 1
## advancing 1
## adversaries 1
## afford 2
## afghanistan 1
## age 2
## ages 1
## ago 1
## aims 1
## alarmed 1
## alliances 1
## alone 1
## alongside 1
## already 1
## also 2
## always 1
## ambitions 2
## america 8
## american 3
## americans 2
## americas 2
## amidst 1
## ancestors 1
## answer 2
## apologize 1
## apply 1
## arguments 1
## arlington 1
## around 1
## aside 1
## ask 1
## assure 1
## back 2
## bad 1
## badly 1
## band 1
## based 1
## began 1
## begin 2
## believe 1
## beneath 1
## bestowed 1
## better 2
## big 2
## bigger 1
## bind 1
## birth 2
## bitter 1
## blame 1
## bless 2
## blood 2
## bodies 1
## bold 1
## borders 1
## born 1
## borne 1
## brave 2
## break 1
## bridges 1
## brings 1
## broken 1
## build 2
## bush 1
## business 1
## businesses 1
## calls 2
## came 1
## campfires 1
## capacity 1
## capital 1
## capitals 1
## care 2
## cares 1
## carried 3
## carry 1
## cars 1
## cause 1
## celebrated 1
## celebration 1
## challenges 2
## chance 1
## change 1
## changed 1
## chapter 1
## character 1
## charity 1
## charter 2
## child 2
## childish 1
## children 2
## childrens 1
## choice 1
## choices 1
## choose 1
## chosen 1
## christians 1
## citizen 1
## citizenship 1
## city 1
## civil 1
## clean 1
## cling 1
## clouds 1
## coldest 1
## collective 1
## colleges 1
## come 4
## commerce 1
## common 6
## communism 1
## concord 1
## confidence 2
## conflict 2
## consequence 1
## consider 1
## consume 1
## consumed 1
## continue 1
## control 1
## convictions 1
## cooperation 2
## corruption 1
## cost 1
## costly 1
## country 2
## courag 1
## courage 2
## create 1
## creed 1
## crisis 4
## culture 1
## curiosity 1
## currents 1
## cut 1
## cynics 1
## danger 1
## dangers 1
## dark 1
## darkest 1
## data 1
## day 5
## deceit 1
## decent 1
## decides 1
## decisions 1
## decline 1
## defeat 1
## defense 2
## define 1
## defining 1
## delivered 1
## demand 1
## demanded 1
## demands 1
## depended 1
## depends 1
## depth 1
## deserts 1
## deserve 1
## destini 1
## destroy 1
## determination 1
## died 1
## differences 1
## difficult 1
## digital 1
## dignified 1
## dignity 1
## discord 1
## dissent 1
## dissolve 1
## distant 1
## docu 1
## doers 1
## dogmas 1
## dollars 1
## domestic 1
## done 2
## doubt 1
## drafted 1
## drawn 1
## dust 1
## duties 2
## dying 1
## earlier 1
## earned 1
## earth 3
## easily 1
## economy 3
## effect 1
## effort 1
## electric 1
## emanates 1
## embody 1
## emerged 1
## end 4
## endure 1
## endured 1
## enduring 2
## enemy 1
## energy 1
## enjoy 1
## entitle 1
## equal 1
## era 2
## even 2
## every 8
## everywhere 1
## evidence 1
## example 1
## expand 1
## expanded 1
## expediences 1
## extend 2
## eye 1
## eyes 1
## face 2
## faced 2
## fact 1
## factories 1
## fail 2
## failure 1
## fainthearted 1
## fair 1
## faith 2
## faithful 1
## fallen 1
## false 2
## falter 1
## fame 1
## families 1
## far 2
## farms 1
## faroff 1
## farreaching 1
## fascism 1
## father 3
## fathers 1
## favors 1
## fear 2
## feed 2
## fellow 1
## filled 1
## finally 1
## find 2
## firefighters 1
## firm 1
## fist 1
## fixed 1
## flourish 1
## flow 1
## foes 1
## forbearers 1
## force 3
## forge 1
## forgotten 1
## former 1
## forth 2
## fortyfour 1
## forward 3
## fought 1
## foundation 1
## founding 2
## free 2
## freedom 3
## friend 2
## friends 1
## fuel 1
## full 1
## future 3
## gather 1
## gathering 1
## gener 1
## generate 1
## generation 5
## generations 2
## generosity 1
## gettysburg 1
## gift 2
## give 1
## given 1
## giving 1
## gladly 1
## globe 1
## god 3
## godgiven 1
## gods 1
## good 2
## goods 1
## govern 1
## government 2
## governments 1
## grace 1
## grandest 1
## grateful 1
## gratitude 1
## great 1
## greater 4
## greatness 2
## greed 1
## grids 1
## grievances 1
## gross 1
## ground 1
## grows 2
## growth 1
## grudgingly 1
## guardians 1
## guided 1
## habits 1
## hand 1
## hands 1
## happi 1
## hard 3
## hardearned 1
## hardship 1
## harness 1
## hatred 1
## hatreds 1
## health 2
## heart 1
## held 1
## help 1
## helps 1
## heritage 1
## heroes 1
## high 1
## hindus 1
## history 3
## homes 1
## honesty 1
## honor 1
## hope 3
## horizon 1
## hour 1
## hours 2
## huddled 1
## humanity 1
## humble 1
## humbled 1
## humility 1
## hungry 1
## icy 2
## idea 1
## ideals 3
## ill 1
## ills 1
## imagination 1
## imagine 1
## inaugural 1
## indicators 1
## indifference 1
## individual 1
## inducing 1
## inevitable 1
## inhabit 1
## innocents 1
## instead 1
## instruments 1
## intend 1
## interest 1
## interests 1
## inventive 1
## iraq 1
## irresponsibility 1
## january 1
## jews 1
## job 1
## jobs 3
## join 1
## joined 1
## journey 3
## judge 1
## just 3
## justness 1
## keepers 1
## khe 1
## kindness 1
## knew 1
## know 5
## knowledge 2
## labor 1
## land 1
## language 1
## lash 1
## last 3
## law 1
## lay 1
## lead 1
## leaders 1
## leave 1
## legacy 1
## leisure 1
## less 7
## lessen 1
## let 7
## levees 1
## liberty 2
## lie 1
## lif 1
## life 2
## light 2
## like 2
## lines 2
## live 1
## local 1
## long 4
## longer 2
## look 1
## lose 1
## lost 1
## lower 2
## loyalty 1
## magnificent 1
## make 2
## makers 1
## mall 1
## man 3
## manage 1
## many 3
## mark 1
## market 2
## may 3
## meaning 2
## measurable 1
## measure 1
## meet 4
## memories 1
## men 4
## met 2
## midst 1
## might 2
## mindful 1
## minds 2
## missiles 1
## moment 3
## moments 1
## month 1
## months 1
## mountains 1
## move 1
## much 1
## muslim 1
## muslims 1
## must 8
## mutual 2
## nagging 1
## narrow 1
## nation 12
## nations 3
## necessity 1
## needed 1
## network 1
## never 2
## new 11
## next 1
## noble 1
## nonbelievers 1
## normandy 1
## nothing 2
## nourish 1
## now 6
## nuclear 1
## nurture 1
## oath 3
## obama 1
## obscure 1
## oceans 1
## office 1
## often 2
## old 3
## one 2
## opportunity 1
## ordered 1
## outcome 1
## outlast 1
## outside 1
## packed 1
## parents 1
## part 2
## pass 1
## passed 2
## pat 1
## patchwork 1
## path 2
## patriotism 1
## patriots 1
## patrol 1
## peac 1
## peace 3
## peopl 1
## people 6
## peoples 1
## perils 1
## petty 1
## pick 1
## place 1
## places 1
## planet 2
## plans 1
## play 2
## please 1
## pleasures 1
## pledge 1
## plenty 1
## plowed 1
## polit 1
## political 1
## poor 1
## possessions 1
## power 4
## powerful 1
## precious 1
## precisely 1
## prefer 1
## prepare 1
## president 1
## presidential 1
## price 1
## principles 1
## proclaim 1
## product 1
## productive 1
## profound 1
## programs 1
## progress 1
## promise 2
## promises 1
## prosper 1
## prosperity 3
## prosperous 2
## protect 1
## protecting 1
## prudent 1
## publics 1
## purpose 2
## pursue 1
## putting 1
## qualities 1
## quality 1
## question 3
## quiet 1
## race 1
## raging 1
## raise 1
## rather 3
## raw 1
## reach 1
## read 1
## ready 1
## reaffirm 1
## reaffirming 1
## real 1
## recall 1
## recognition 1
## recriminations 1
## reform 1
## refused 1
## regard 1
## reject 1
## relative 1
## relies 1
## remain 2
## remained 1
## remains 1
## remaking 1
## remember 2
## remembrance 1
## reminded 1
## required 1
## resources 1
## respect 1
## responsibility 1
## responsibly 1
## restaurant 1
## restore 2
## restraint 1
## retirement 1
## return 1
## reveal 1
## revolution 1
## riches 1
## rightful 1
## rights 1
## rising 1
## risktakers 1
## river 1
## road 1
## roads 1
## role 1
## roll 1
## route 1
## rugged 1
## rule 1
## run 1
## sacred 1
## sacrificed 1
## sacrifices 1
## safely 1
## safety 1
## sahn 1
## said 1
## sake 1
## sapping 1
## satisfying 1
## saw 1
## say 3
## scale 1
## scarcely 1
## schools 2
## science 1
## scripture 1
## search 1
## security 1
## see 1
## seek 4
## seeks 1
## sees 1
## segregation 1
## seize 1
## selflessness 1
## serious 1
## served 1
## service 2
## services 1
## set 1
## settled 1
## settling 1
## shall 3
## shape 1
## shaped 1
## shed 1
## shifted 1
## shores 1
## short 2
## shortcuts 1
## shown 1
## shuttered 1
## side 1
## sight 1
## silencing 1
## simply 1
## sixty 1
## size 1
## skill 1
## slaughtering 1
## small 3
## smaller 1
## smoke 1
## snow 1
## societys 1
## soil 1
## someday 1
## something 2
## soon 1
## source 1
## sow 1
## span 1
## specter 1
## spend 1
## spin 1
## spirit 5
## spoken 1
## stained 1
## stairway 1
## stale 1
## stand 2
## standing 1
## starting 1
## starved 1
## state 1
## states 1
## statistics 1
## still 2
## storm 1
## storms 2
## stranger 1
## strangled 1
## strength 1
## strengthen 1
## stronger 2
## struggled 1
## sturdy 1
## subject 1
## success 2
## suffering 1
## suggest 1
## sum 1
## sun 1
## surely 1
## surest 1
## survivethat 1
## sweatshops 1
## swift 1
## swill 1
## system 1
## take 2
## taken 2
## tanks 1
## task 2
## tasted 1
## technologys 1
## tell 1
## tempering 1
## terror 1
## tested 1
## thank 2
## things 4
## threat 1
## threaten 1
## threats 1
## throughout 2
## tides 1
## till 1
## time 6
## timeless 1
## tirelessly 1
## today 6
## together 1
## toiled 1
## told 1
## tolerance 1
## tolerate 1
## towards 1
## transform 1
## transit 1
## traveled 2
## tribe 1
## true 2
## trust 2
## truths 1
## turn 1
## ultimately 1
## uncertain 1
## unclench 1
## understand 2
## understanding 1
## understood 2
## undiminished 1
## unfolds 1
## united 2
## unity 1
## universities 1
## unmatched 1
## unpleasant 1
## upon 3
## use 2
## ushering 1
## values 1
## village 1
## violence 1
## virtue 2
## vision 1
## vital 1
## wage 1
## war 2
## warming 1
## watchful 1
## watching 1
## waters 2
## waver 1
## way 2
## ways 1
## weakened 1
## weakness 1
## wealth 2
## week 1
## well 2
## west 2
## whether 4
## whip 1
## whisper 1
## whose 1
## wield 1
## will 18
## willing 2
## willingness 2
## winds 1
## winter 2
## wisely 1
## without 2
## woman 1
## women 4
## wonders 1
## words 4
## work 6
## worked 1
## workers 2
## works 1
## world 5
## worldly 1
## worlds 1
## worldthat 1
## worn 1
## wrong 1
## year 2
## years 1
## yes 1
## yet 2
## young 1
findFreqTerms(myDtm, lowfreq=10)
## [1] "nation" "new" "will"
findAssocs(myDtm, 'nation', 0.1)
## $nation
## numeric(0)
m <- as.matrix(myDtm)
v <- sort(rowSums(m), decreasing=TRUE)
v
## will nation new america
## 18 12 11 8
## every must less let
## 8 8 7 7
## common now people time
## 6 6 6 6
## today work day generation
## 6 6 5 5
## know spirit world come
## 5 5 5 4
## crisis end greater long
## 4 4 4 4
## meet men power seek
## 4 4 4 4
## things whether women words
## 4 4 4 4
## across american carried earth
## 3 3 3 3
## economy father force forward
## 3 3 3 3
## freedom future god hard
## 3 3 3 3
## history hope ideals jobs
## 3 3 3 3
## journey just last man
## 3 3 3 3
## many may moment nations
## 3 3 3 3
## oath old peace prosperity
## 3 3 3 3
## question rather say shall
## 3 3 3 3
## small upon afford age
## 3 3 2 2
## also ambitions americans americas
## 2 2 2 2
## answer back begin better
## 2 2 2 2
## big birth bless blood
## 2 2 2 2
## brave build calls care
## 2 2 2 2
## challenges charter child children
## 2 2 2 2
## confidence conflict cooperation country
## 2 2 2 2
## courage defense done duties
## 2 2 2 2
## enduring era even extend
## 2 2 2 2
## face faced fail faith
## 2 2 2 2
## false far fear feed
## 2 2 2 2
## find forth founding free
## 2 2 2 2
## friend generations gift good
## 2 2 2 2
## government greatness grows health
## 2 2 2 2
## hours icy knowledge liberty
## 2 2 2 2
## life light like lines
## 2 2 2 2
## longer lower make market
## 2 2 2 2
## meaning met might minds
## 2 2 2 2
## mutual never nothing often
## 2 2 2 2
## one part passed path
## 2 2 2 2
## planet play promise prosperous
## 2 2 2 2
## purpose remain remember restore
## 2 2 2 2
## schools service short something
## 2 2 2 2
## stand still storms stronger
## 2 2 2 2
## success take taken task
## 2 2 2 2
## thank throughout traveled true
## 2 2 2 2
## trust understand understood united
## 2 2 2 2
## use virtue war waters
## 2 2 2 2
## way wealth well west
## 2 2 2 2
## willing willingness winter without
## 2 2 2 2
## workers year yet Â’ll
## 2 2 2 1
## abandoned ability accept account
## 1 1 1 1
## achieve act action address
## 1 1 1 1
## advance advancing adversaries afghanistan
## 1 1 1 1
## ages ago aims alarmed
## 1 1 1 1
## alliances alone alongside already
## 1 1 1 1
## always amidst ancestors apologize
## 1 1 1 1
## apply arguments arlington around
## 1 1 1 1
## aside ask assure bad
## 1 1 1 1
## badly band based began
## 1 1 1 1
## believe beneath bestowed bigger
## 1 1 1 1
## bind bitter blame bodies
## 1 1 1 1
## bold borders born borne
## 1 1 1 1
## break bridges brings broken
## 1 1 1 1
## bush business businesses came
## 1 1 1 1
## campfires capacity capital capitals
## 1 1 1 1
## cares carry cars cause
## 1 1 1 1
## celebrated celebration chance change
## 1 1 1 1
## changed chapter character charity
## 1 1 1 1
## childish childrens choice choices
## 1 1 1 1
## choose chosen christians citizen
## 1 1 1 1
## citizenship city civil clean
## 1 1 1 1
## cling clouds coldest collective
## 1 1 1 1
## colleges commerce communism concord
## 1 1 1 1
## consequence consider consume consumed
## 1 1 1 1
## continue control convictions corruption
## 1 1 1 1
## cost costly courag create
## 1 1 1 1
## creed culture curiosity currents
## 1 1 1 1
## cut cynics danger dangers
## 1 1 1 1
## dark darkest data deceit
## 1 1 1 1
## decent decides decisions decline
## 1 1 1 1
## defeat define defining delivered
## 1 1 1 1
## demand demanded demands depended
## 1 1 1 1
## depends depth deserts deserve
## 1 1 1 1
## destini destroy determination died
## 1 1 1 1
## differences difficult digital dignified
## 1 1 1 1
## dignity discord dissent dissolve
## 1 1 1 1
## distant docu doers dogmas
## 1 1 1 1
## dollars domestic doubt drafted
## 1 1 1 1
## drawn dust dying earlier
## 1 1 1 1
## earned easily effect effort
## 1 1 1 1
## electric emanates embody emerged
## 1 1 1 1
## endure endured enemy energy
## 1 1 1 1
## enjoy entitle equal everywhere
## 1 1 1 1
## evidence example expand expanded
## 1 1 1 1
## expediences eye eyes fact
## 1 1 1 1
## factories failure fainthearted fair
## 1 1 1 1
## faithful fallen falter fame
## 1 1 1 1
## families farms faroff farreaching
## 1 1 1 1
## fascism fathers favors fellow
## 1 1 1 1
## filled finally firefighters firm
## 1 1 1 1
## fist fixed flourish flow
## 1 1 1 1
## foes forbearers forge forgotten
## 1 1 1 1
## former fortyfour fought foundation
## 1 1 1 1
## friends fuel full gather
## 1 1 1 1
## gathering gener generate generosity
## 1 1 1 1
## gettysburg give given giving
## 1 1 1 1
## gladly globe godgiven gods
## 1 1 1 1
## goods govern governments grace
## 1 1 1 1
## grandest grateful gratitude great
## 1 1 1 1
## greed grids grievances gross
## 1 1 1 1
## ground growth grudgingly guardians
## 1 1 1 1
## guided habits hand hands
## 1 1 1 1
## happi hardearned hardship harness
## 1 1 1 1
## hatred hatreds heart held
## 1 1 1 1
## help helps heritage heroes
## 1 1 1 1
## high hindus homes honesty
## 1 1 1 1
## honor horizon hour huddled
## 1 1 1 1
## humanity humble humbled humility
## 1 1 1 1
## hungry idea ill ills
## 1 1 1 1
## imagination imagine inaugural indicators
## 1 1 1 1
## indifference individual inducing inevitable
## 1 1 1 1
## inhabit innocents instead instruments
## 1 1 1 1
## intend interest interests inventive
## 1 1 1 1
## iraq irresponsibility january jews
## 1 1 1 1
## job join joined judge
## 1 1 1 1
## justness keepers khe kindness
## 1 1 1 1
## knew labor land language
## 1 1 1 1
## lash law lay lead
## 1 1 1 1
## leaders leave legacy leisure
## 1 1 1 1
## lessen levees lie lif
## 1 1 1 1
## live local look lose
## 1 1 1 1
## lost loyalty magnificent makers
## 1 1 1 1
## mall manage mark measurable
## 1 1 1 1
## measure memories midst mindful
## 1 1 1 1
## missiles moments month months
## 1 1 1 1
## mountains move much muslim
## 1 1 1 1
## muslims nagging narrow necessity
## 1 1 1 1
## needed network next noble
## 1 1 1 1
## nonbelievers normandy nourish nuclear
## 1 1 1 1
## nurture obama obscure oceans
## 1 1 1 1
## office opportunity ordered outcome
## 1 1 1 1
## outlast outside packed parents
## 1 1 1 1
## pass pat patchwork patriotism
## 1 1 1 1
## patriots patrol peac peopl
## 1 1 1 1
## peoples perils petty pick
## 1 1 1 1
## place places plans please
## 1 1 1 1
## pleasures pledge plenty plowed
## 1 1 1 1
## polit political poor possessions
## 1 1 1 1
## powerful precious precisely prefer
## 1 1 1 1
## prepare president presidential price
## 1 1 1 1
## principles proclaim product productive
## 1 1 1 1
## profound programs progress promises
## 1 1 1 1
## prosper protect protecting prudent
## 1 1 1 1
## publics pursue putting qualities
## 1 1 1 1
## quality quiet race raging
## 1 1 1 1
## raise raw reach read
## 1 1 1 1
## ready reaffirm reaffirming real
## 1 1 1 1
## recall recognition recriminations reform
## 1 1 1 1
## refused regard reject relative
## 1 1 1 1
## relies remained remains remaking
## 1 1 1 1
## remembrance reminded required resources
## 1 1 1 1
## respect responsibility responsibly restaurant
## 1 1 1 1
## restraint retirement return reveal
## 1 1 1 1
## revolution riches rightful rights
## 1 1 1 1
## rising risktakers river road
## 1 1 1 1
## roads role roll route
## 1 1 1 1
## rugged rule run sacred
## 1 1 1 1
## sacrificed sacrifices safely safety
## 1 1 1 1
## sahn said sake sapping
## 1 1 1 1
## satisfying saw scale scarcely
## 1 1 1 1
## science scripture search security
## 1 1 1 1
## see seeks sees segregation
## 1 1 1 1
## seize selflessness serious served
## 1 1 1 1
## services set settled settling
## 1 1 1 1
## shape shaped shed shifted
## 1 1 1 1
## shores shortcuts shown shuttered
## 1 1 1 1
## side sight silencing simply
## 1 1 1 1
## sixty size skill slaughtering
## 1 1 1 1
## smaller smoke snow societys
## 1 1 1 1
## soil someday soon source
## 1 1 1 1
## sow span specter spend
## 1 1 1 1
## spin spoken stained stairway
## 1 1 1 1
## stale standing starting starved
## 1 1 1 1
## state states statistics storm
## 1 1 1 1
## stranger strangled strength strengthen
## 1 1 1 1
## struggled sturdy subject suffering
## 1 1 1 1
## suggest sum sun surely
## 1 1 1 1
## surest survivethat sweatshops swift
## 1 1 1 1
## swill system tanks tasted
## 1 1 1 1
## technologys tell tempering terror
## 1 1 1 1
## tested threat threaten threats
## 1 1 1 1
## tides till timeless tirelessly
## 1 1 1 1
## together toiled told tolerance
## 1 1 1 1
## tolerate towards transform transit
## 1 1 1 1
## tribe truths turn ultimately
## 1 1 1 1
## uncertain unclench understanding undiminished
## 1 1 1 1
## unfolds unity universities unmatched
## 1 1 1 1
## unpleasant ushering values village
## 1 1 1 1
## violence vision vital wage
## 1 1 1 1
## warming watchful watching waver
## 1 1 1 1
## ways weakened weakness week
## 1 1 1 1
## whip whisper whose wield
## 1 1 1 1
## winds wisely woman wonders
## 1 1 1 1
## worked works worldly worlds
## 1 1 1 1
## worldthat worn wrong years
## 1 1 1 1
## yes young
## 1 1
myNames <- names(v)
d <- data.frame(word=myNames, freq=v)
wordcloud(d$word, d$freq, min.freq=3,col=brewer.pal(5,"Spectral"))