#install.packages("tm")
#install.packages("SnowballC")
#install.packages("wordcloud")
#install.packages("RColorBrewer")
#install.packages("dplyr")
#install.packages("tidyr")
#install.packages("stringr")
#install.packages("udpipe")
#install.packages("lattice")
#install.packages("ggplot2")
#install.packages("lubridate")
library(tm)
## Loading required package: NLP
library(SnowballC)
library(wordcloud)
## Loading required package: RColorBrewer
library(RColorBrewer)
library(dplyr)
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
library(tidyr)
library(stringr)
library(udpipe)
library(lattice)
library(ggplot2)
##
## Attaching package: 'ggplot2'
## The following object is masked from 'package:NLP':
##
## annotate
library(lubridate)
##
## Attaching package: 'lubridate'
## The following objects are masked from 'package:base':
##
## date, intersect, setdiff, union
udmodel_file <- 'english-ewt-ud-2.5-191206.udpipe'
if (!file.exists(udmodel_file)) {
udmodel <- udpipe_download_model(language = "english")
}
udmodel_english <- udpipe_load_model(file = udmodel_file)
reviews_raw <- read.csv('all_kindle_review .csv', stringsAsFactors = FALSE)
# Limpiamos los nombres de las columnas
names(reviews_raw) <- str_trim(names(reviews_raw))
reviews <- reviews_raw %>%
select(rating, reviewText, reviewTime) %>%
mutate(reviewTime = mdy(reviewTime)) %>%
filter(!is.na(reviewTime), reviewText != "")
glimpse(reviews)
## Rows: 12,000
## Columns: 3
## $ rating <int> 3, 5, 3, 3, 4, 5, 2, 4, 5, 4, 1, 4, 1, 4, 5, 2, 4, 1, 5, 4,…
## $ reviewText <chr> "Jace Rankin may be short, but he's nothing to mess with, a…
## $ reviewTime <date> 2010-09-02, 2013-10-08, 2014-04-11, 2014-07-05, 2012-12-31…
ggplot(reviews, aes(x = factor(rating))) +
geom_bar(fill = "steelblue") +
labs(title = "Distribución de Calificaciones (Ratings)",
x = "Rating",
y = "Cantidad de Reseñas") +
theme_minimal()
reviews %>%
mutate(year = year(reviewTime)) %>%
count(year) %>%
ggplot(aes(x = factor(year), y = n)) +
geom_bar(stat = "identity", fill = "skyblue") +
labs(title = "Número de Reseñas por Año",
x = "Año",
y = "Cantidad de Reseñas") +
theme_minimal() +
theme(axis.text.x = element_text(angle = 45, hjust = 1))
reviews_filtered <- reviews %>%
filter(reviewTime >= as.Date("2013-01-01") & reviewTime <= as.Date("2013-06-30"))
reviews_pos <- reviews_filtered %>% filter(rating == 5)
reviews_neg <- reviews_filtered %>% filter(rating == 1)
cat("Total de reseñas en el periodo:", nrow(reviews_filtered), "\n")
## Total de reseñas en el periodo: 2444
cat("Reseñas Positivas (5 estrellas):", nrow(reviews_pos), "\n")
## Reseñas Positivas (5 estrellas): 632
cat("Reseñas Negativas (1 estrella):", nrow(reviews_neg), "\n")
## Reseñas Negativas (1 estrella): 383
analizar_texto <- function(df, titulo) {
cat("\n\n==================================================")
cat("\nINICIANDO ANÁLISIS PARA:", titulo)
cat("\n==================================================\n")
# 1. Crear Corpus y Limpieza General
docs <- Corpus(VectorSource(df$reviewText))
docs_clean <- docs %>%
tm_map(content_transformer(tolower)) %>%
tm_map(removeNumbers) %>%
tm_map(removePunctuation) %>%
tm_map(stripWhitespace)
# Frecuencia de palabras ANTES de quitar stopwords
dtm_before <- TermDocumentMatrix(docs_clean)
m_before <- as.matrix(dtm_before)
v_before <- sort(rowSums(m_before), decreasing=TRUE)
d_before <- data.frame(word = names(v_before), freq=v_before)
cat("\n--- Palabras más frecuentes (ANTES de quitar stopwords) ---\n")
print(head(d_before, 20))
# Quitar stopwords
docs_clean <- docs_clean %>%
tm_map(removeWords, stopwords("english")) %>%
# Añadimos stopwords personalizadas y comunes en este contexto
tm_map(removeWords, c("book", "read", "story", "kindle", "author", "one", "also", "get", "just", "like"))
# 2. Term-Document Matrix (DESPUÉS de quitar stopwords)
dtm <- TermDocumentMatrix(docs_clean)
m <- as.matrix(dtm)
v <- sort(rowSums(m), decreasing=TRUE)
d <- data.frame(word = names(v), freq=v)
cat("\n--- Palabras más frecuentes (DESPUÉS de quitar stopwords) ---\n")
print(head(d, 20))
# 3. Nube de Palabras
set.seed(1234)
wordcloud(words = d$word, freq = d$freq, min.freq = 5,
max.words=100, random.order=FALSE, rot.per=0.35,
colors=brewer.pal(8, "Dark2"))
title(main = paste("Nube de Palabras -", titulo), font.main = 1, cex.main = 1.5)
# 4. Encontrar Asociaciones (para las 10 palabras más frecuentes)
cat("\n--- Asociaciones para las 10 palabras más frecuentes ---\n")
top_words <- head(d$word, 10)
for(word in top_words){
associations <- findAssocs(dtm, terms = word, corlimit = 0.1)
cat("\nPalabra:", word, "\n")
print(associations)
}
# 5. Análisis con udpipe (POS, RAKE)
# Usamos una muestra para agilizar el proceso si el dataset es muy grande
sample_text <- head(df$reviewText, 1000)
x <- udpipe_annotate(udmodel_english, x = sample_text)
x <- as.data.frame(x)
# Sustantivos
stats_noun <- subset(x, upos %in% c("NOUN"))
stats_noun <- txt_freq(stats_noun$token)
stats_noun$key <- factor(stats_noun$key, levels = rev(stats_noun$key))
print(barchart(key ~ freq, data = head(stats_noun, 20), col = "cadetblue",
main = paste("Sustantivos más comunes -", titulo)))
# Adjetivos
stats_adj <- subset(x, upos %in% c("ADJ"))
stats_adj <- txt_freq(stats_adj$token)
stats_adj$key <- factor(stats_adj$key, levels = rev(stats_adj$key))
print(barchart(key ~ freq, data = head(stats_adj, 20), col = "purple",
main = paste("Adjetivos más comunes -", titulo)))
# Verbos
stats_verb <- subset(x, upos %in% c("VERB"))
stats_verb <- txt_freq(stats_verb$token)
stats_verb$key <- factor(stats_verb$key, levels = rev(stats_verb$key))
print(barchart(key ~ freq, data = head(stats_verb, 20), col = "gold",
main = paste("Verbos más comunes -", titulo)))
# 6. Algoritmo RAKE
stats_rake <- keywords_rake(x = x, term = "lemma", group = "doc_id",
relevant = x$upos %in% c("NOUN", "ADJ"))
stats_rake$key <- factor(stats_rake$keyword, levels = rev(stats_rake$keyword))
print(barchart(key ~ rake, data = head(subset(stats_rake, freq > 2), 20), col = "red",
main = paste("Frases Clave (RAKE) -", titulo)))
}
analizar_texto(reviews_pos, "Reseñas Positivas (5 Estrellas)")
##
##
## ==================================================
## INICIANDO ANÁLISIS PARA: Reseñas Positivas (5 Estrellas)
## ==================================================
## Warning in tm_map.SimpleCorpus(., content_transformer(tolower)): transformation
## drops documents
## Warning in tm_map.SimpleCorpus(., removeNumbers): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(., removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(., stripWhitespace): transformation drops
## documents
##
## --- Palabras más frecuentes (ANTES de quitar stopwords) ---
## word freq
## the the 1697
## and and 1205
## this this 733
## book book 426
## was was 383
## read read 377
## that that 368
## you you 334
## for for 307
## with with 293
## story story 289
## have have 243
## love love 241
## but but 210
## her her 204
## books books 187
## are are 187
## one one 182
## good good 179
## all all 179
## Warning in tm_map.SimpleCorpus(., removeWords, stopwords("english")):
## transformation drops documents
## Warning in tm_map.SimpleCorpus(., removeWords, c("book", "read", "story", :
## transformation drops documents
##
## --- Palabras más frecuentes (DESPUÉS de quitar stopwords) ---
## word freq
## love love 241
## books books 187
## good good 179
## series series 165
## great great 152
## characters characters 131
## reading reading 121
## really really 117
## will will 113
## loved loved 106
## stories stories 91
## well well 90
## can can 83
## enjoyed enjoyed 83
## time time 82
## way way 70
## next next 65
## first first 63
## recommend recommend 63
## cant cant 61
##
## --- Asociaciones para las 10 palabras más frecuentes ---
##
## Palabra: love
## $love
## colter kgi awakened closure eerie
## 0.28 0.28 0.25 0.25 0.25
## final points realism reccomend storythere
## 0.25 0.25 0.25 0.25 0.25
## wounds zsadists betreyal couragious criptic
## 0.25 0.25 0.25 0.25 0.25
## familylove forgive luc lucs paini
## 0.25 0.25 0.25 0.25 0.25
## skye sompalpable forgiveness sunset pain
## 0.25 0.25 0.24 0.24 0.23
## education maya away fell particular
## 0.22 0.21 0.21 0.21 0.21
## rare self fall angel appointed
## 0.20 0.20 0.20 0.20 0.20
## ass attentions austen blurred cinderella
## 0.20 0.20 0.20 0.20 0.20
## clenching conquers conspire crass deanes
## 0.20 0.20 0.20 0.20 0.20
## deceased despises distract dolt editing
## 0.20 0.20 0.20 0.20 0.20
## emmeline enterprising entitled errant escapades
## 0.20 0.20 0.20 0.20 0.20
## furthermore guardian happily hiram hirams
## 0.20 0.20 0.20 0.20 0.20
## imperfections invoked jealous judge kick
## 0.20 0.20 0.20 0.20 0.20
## kindly lauged lawyer letter literally
## 0.20 0.20 0.20 0.20 0.20
## mannered marcia marks members mirandas
## 0.20 0.20 0.20 0.20 0.20
## nate nathaniel nathaniels nephew obtain
## 0.20 0.20 0.20 0.20 0.20
## occasional phobes phoebe phoebes presence
## 0.20 0.20 0.20 0.20 0.20
## proclamation prominent raise refined reproduction
## 0.20 0.20 0.20 0.20 0.20
## sail scannedphoebe scheming schuyler sees
## 0.20 0.20 0.20 0.20 0.20
## soft spafford spoken stalk state
## 0.20 0.20 0.20 0.20 0.20
## stepmother succeeded suffering suit teeth
## 0.20 0.20 0.20 0.20 0.20
## towns truthfully typos uncle unwelcome
## 0.20 0.20 0.20 0.20 0.20
## visits wishing york abound achieve
## 0.20 0.20 0.20 0.20 0.20
## brutal diane fertile fortune gaston
## 0.20 0.20 0.20 0.20 0.20
## groundthis toldtwo wartogether wherever brought
## 0.20 0.20 0.20 0.20 0.19
## hero determined accept fear albert
## 0.19 0.19 0.19 0.19 0.19
## poor appears emotions disappoint watching
## 0.19 0.19 0.19 0.18 0.18
## husband meets miranda happy banks
## 0.18 0.18 0.18 0.17 0.17
## mother green child marry issues
## 0.17 0.17 0.17 0.17 0.17
## guys rejection became deane girl
## 0.17 0.17 0.17 0.17 0.16
## gets claim deeper siblings emotional
## 0.16 0.16 0.16 0.16 0.16
## sight enthralled felt caused bookthis
## 0.16 0.16 0.16 0.16 0.16
## boundaries adored leigh lora honestly
## 0.16 0.16 0.16 0.16 0.16
## tradition understood wide orphan quality
## 0.16 0.16 0.16 0.16 0.16
## half truly course passion many
## 0.15 0.15 0.15 0.15 0.15
## thanks city father gem sorry
## 0.15 0.15 0.15 0.15 0.15
## hate face complain view heal
## 0.15 0.15 0.15 0.15 0.15
## begins word amazed best series
## 0.15 0.15 0.15 0.14 0.14
## character zsadist wrong approach exchange
## 0.14 0.14 0.14 0.14 0.14
## flying futuresagain grows hang hawks
## 0.14 0.14 0.14 0.14 0.14
## mistakes sachin storiesi undeniable visit
## 0.14 0.14 0.14 0.14 0.14
## assisted crush fiance gone goodbye
## 0.14 0.14 0.14 0.14 0.14
## humiliation infidelities loser impatiently tootheir
## 0.14 0.14 0.14 0.14 0.14
## arielle chemestry needed push sneaky
## 0.14 0.14 0.14 0.14 0.14
## zack know awesome hurts went
## 0.14 0.13 0.13 0.13 0.13
## romance mission fact least paranormal
## 0.13 0.13 0.13 0.13 0.13
## pick learning pasts reviewers states
## 0.13 0.13 0.13 0.13 0.13
## immediately intend include told bride
## 0.13 0.13 0.13 0.13 0.13
## crying lovers despised helped lover
## 0.13 0.13 0.13 0.13 0.13
## beauty nicely plain present pictures
## 0.13 0.13 0.13 0.13 0.13
## towards mild triology clearly deeply
## 0.13 0.13 0.13 0.13 0.13
## everytime proposal woods visited indeed
## 0.13 0.13 0.13 0.13 0.13
## way family meeting loose doesnt
## 0.12 0.12 0.12 0.12 0.12
## live bella fans possible scared
## 0.12 0.12 0.12 0.12 0.12
## took main scene sadness clean
## 0.12 0.12 0.12 0.12 0.12
## describe begin shortly yes beloved
## 0.12 0.12 0.12 0.12 0.12
## loss will reason copy lives
## 0.12 0.11 0.11 0.11 0.11
## beautiful wanted works house evil
## 0.11 0.11 0.10 0.10 0.10
## wife lose isnt money picked
## 0.10 0.10 0.10 0.10 0.10
## finds guy
## 0.10 0.10
##
##
## Palabra: books
## $books
## bundle cian follows himps
## 0.31 0.30 0.30 0.30
## hoot worry reviews order
## 0.30 0.30 0.29 0.25
## irishman mallerys necessary sisters
## 0.24 0.24 0.24 0.24
## wouldbe impressed say likes
## 0.24 0.23 0.23 0.22
## series next three first
## 0.21 0.21 0.21 0.20
## packed cry location released
## 0.20 0.20 0.20 0.20
## werewolves follow sorry blood
## 0.19 0.19 0.19 0.19
## susan imagine range lost
## 0.19 0.19 0.18 0.17
## rising builds consists counted
## 0.17 0.17 0.17 0.17
## courageousthe dauntlessthe desperate displace
## 0.17 0.17 0.17 0.17
## epic fearlessthe fleet frontier
## 0.17 0.17 0.17 0.17
## geary genius handful invincible
## 0.17 0.17 0.17 0.17
## locations ofthe opponents reasoned
## 0.17 0.17 0.17 0.17
## relentless relentlessandthe run seemingly
## 0.17 0.17 0.17 0.17
## serieseach seriesthe standard syndics
## 0.17 0.17 0.17 0.17
## tactical tangible universethe valiantthe
## 0.17 0.17 0.17 0.17
## victorious anxiously arc blog
## 0.17 0.17 0.17 0.17
## customer expecting horrible lark
## 0.17 0.17 0.17 0.17
## preorder rarely updates ware
## 0.17 0.17 0.17 0.17
## website far space last
## 0.17 0.16 0.16 0.16
## already paranormal apocrypha post
## 0.16 0.16 0.15 0.15
## jennifer illustrations staying border
## 0.15 0.15 0.15 0.15
## lair buying risks males
## 0.15 0.15 0.15 0.15
## currently checking exception carter
## 0.15 0.15 0.15 0.15
## bible sure set dont
## 0.14 0.14 0.14 0.14
## continues dark alliance available
## 0.14 0.14 0.14 0.13
## included authors original now
## 0.13 0.13 0.13 0.13
## bought dragon full knight
## 0.13 0.13 0.13 0.13
## called captain wizard length
## 0.13 0.13 0.13 0.13
## recommend excitement went name
## 0.12 0.12 0.12 0.12
## heart stand tales spot
## 0.12 0.12 0.12 0.12
## wanting complete warfare century
## 0.12 0.12 0.12 0.12
## apocryphafor apocryphaorking best can
## 0.11 0.11 0.11 0.11
## commentary direct editionor halleys
## 0.11 0.11 0.11 0.11
## handbook handbookhalleys handbookthe international
## 0.11 0.11 0.11 0.11
## intros jumporking kindlebible king
## 0.11 0.11 0.11 0.11
## kjv misbach navigation new
## 0.11 0.11 0.11 0.11
## provided ungers verse versiondeluxe
## 0.11 0.11 0.11 0.11
## reading laugh happy please
## 0.11 0.11 0.11 0.11
## action change famous withthis
## 0.11 0.11 0.11 0.11
## purchase jumps backlist clippings
## 0.11 0.11 0.11 0.11
## crusie lane late nineties
## 0.11 0.11 0.11 0.11
## phones hope expense regrets
## 0.11 0.11 0.11 0.11
## lovable rounded supernatural darcs
## 0.11 0.11 0.11 0.11
## eagerly explained itthe mating
## 0.11 0.11 0.11 0.11
## okayi patient peacefully rushed
## 0.11 0.11 0.11 0.11
## rushing substory successfully wonderfuli
## 0.11 0.11 0.11 0.11
## awaiting grace response important
## 0.11 0.11 0.11 0.11
## partner coming journey cards
## 0.11 0.11 0.11 0.11
## arent coachella mirage overly
## 0.11 0.11 0.11 0.11
## rancho boone june mckay
## 0.11 0.11 0.11 0.11
## pre seirre stores dip
## 0.11 0.11 0.11 0.11
## dusty mom protagonists wantthe
## 0.11 0.11 0.11 0.11
## livingston mallery plus livingstons
## 0.11 0.11 0.11 0.11
## appears final fifth flow
## 0.11 0.11 0.11 0.11
## crusoe writesa showing acidic
## 0.11 0.11 0.11 0.11
## anne arrives beasts bedding
## 0.11 0.11 0.11 0.11
## boasts bolts bonded capable
## 0.11 0.11 0.11 0.11
## controlled courageous crossbow darian
## 0.11 0.11 0.11 0.11
## darius defect deranged diamondtipped
## 0.11 0.11 0.11 0.11
## discerns draconia dragonriders eviltwo
## 0.11 0.11 0.11 0.11
## fearing features flaming former
## 0.11 0.11 0.11 0.11
## gradually grave healer injuries
## 0.11 0.11 0.11 0.11
## jared kelzy kingdoms latter
## 0.11 0.11 0.11 0.11
## likely lucan magically mated
## 0.11 0.11 0.11 0.11
## matesthis mccaffreys medieval neighouring
## 0.11 0.11 0.11 0.11
## nico odds openly othersbelora
## 0.11 0.11 0.11 0.11
## palace peril pern piercing
## 0.11 0.11 0.11 0.11
## prince requires resembles resting
## 0.11 0.11 0.11 0.11
## saved scales scarce secrets
## 0.11 0.11 0.11 0.11
## seriously serpentine skithdron skithdrons
## 0.11 0.11 0.11 0.11
## skiths solitary speech spit
## 0.11 0.11 0.11 0.11
## suddenly sympathetic thereby threesomes
## 0.11 0.11 0.11 0.11
## venerai venom venomous waged
## 0.11 0.11 0.11 0.11
## warn warned wellimagined wellmeaning
## 0.11 0.11 0.11 0.11
## willingly witnessed awhile quit
## 0.11 0.11 0.11 0.11
## stephanies central comei demanded
## 0.11 0.11 0.11 0.11
## demented expand extended hob
## 0.11 0.11 0.11 0.11
## meaningful shapeshifter storyi tch
## 0.11 0.11 0.11 0.11
## wicked markhat blossoming boating
## 0.11 0.11 0.11 0.11
## caution dogstacy driver endedjake
## 0.11 0.11 0.11 0.11
## fishing gina headed hide
## 0.11 0.11 0.11 0.11
## hinson identities incident jake
## 0.11 0.11 0.11 0.11
## libraryif limelight media nascar
## 0.11 0.11 0.11 0.11
## pastboth recognize somehow stacy
## 0.11 0.11 0.11 0.11
## wilkinsharlequin content destination opera
## 0.11 0.11 0.11 0.11
## six appropriate boroughs breathing
## 0.11 0.11 0.11 0.11
## browns christmas cliffc clive
## 0.11 0.11 0.11 0.11
## contrived cuslers dan disguises
## 0.11 0.11 0.11 0.11
## disney edgar expensive formulaic
## 0.11 0.11 0.11 0.11
## heck john loaded manifest
## 0.11 0.11 0.11 0.11
## merit packaged preceding produced
## 0.11 0.11 0.11 0.11
## regards rice serially unexporgated
## 0.11 0.11 0.11 0.11
## connecticut doas mysterys hateif
## 0.11 0.11 0.11 0.11
## comparison pales appreciated canon
## 0.11 0.11 0.11 0.11
## provide scriptural biance appetite
## 0.11 0.11 0.11 0.11
## leopards shape shifting wets
## 0.11 0.11 0.11 0.11
## look plots several adults
## 0.10 0.10 0.10 0.10
## come chapter ending knights
## 0.10 0.10 0.10 0.10
## play introduced
## 0.10 0.10
##
##
## Palabra: good
## $good
## reminded justice kings agreement
## 0.31 0.28 0.28 0.26
## angleall attitude bang bloody
## 0.26 0.26 0.26 0.26
## career chillingthe compelling concept
## 0.26 0.26 0.26 0.26
## dishing disturb drop dying
## 0.26 0.26 0.26 0.26
## equally feathers flash generally
## 0.26 0.26 0.26 0.26
## genres gritty hardboiled inthe
## 0.26 0.26 0.26 0.26
## isbut itanother jacqueline jokes
## 0.26 0.26 0.26 0.26
## led lessright majorly meaty
## 0.26 0.26 0.26 0.26
## nighttheres origin parts phineas
## 0.26 0.26 0.26 0.26
## proof publishing rollingin ruffling
## 0.26 0.26 0.26 0.26
## saving screaming selling separated
## 0.26 0.26 0.26 0.26
## shock sock sold sour
## 0.26 0.26 0.26 0.26
## stuffyoure survivor symbios treated
## 0.26 0.26 0.26 0.26
## troutt unpredictable whiskey youre
## 0.26 0.26 0.26 0.26
## stories clever fair include
## 0.23 0.22 0.22 0.22
## really keeps intro stephen
## 0.20 0.20 0.20 0.20
## thriller ebooks type ablaze
## 0.20 0.19 0.19 0.19
## alert angsts chills choices
## 0.19 0.19 0.19 0.19
## dante dips dominantly duncan
## 0.19 0.19 0.19 0.19
## filled flutter focuses forewarned
## 0.19 0.19 0.19 0.19
## inferno lolah malevolent megans
## 0.19 0.19 0.19 0.19
## orginality perfection predecessors progress
## 0.19 0.19 0.19 0.19
## reckoned reviting rippled salute
## 0.19 0.19 0.19 0.19
## scintillating spine stupid sub
## 0.19 0.19 0.19 0.19
## subsequent swoon undeniably valleys
## 0.19 0.19 0.19 0.19
## dinosaur tail wishes decisions
## 0.19 0.19 0.19 0.19
## egypt intelligent mixed mystique
## 0.19 0.19 0.19 0.19
## river smith smiths tho
## 0.19 0.19 0.19 0.19
## wilbur crime horror emotions
## 0.19 0.19 0.19 0.19
## readable squeamish advice arms
## 0.19 0.19 0.19 0.19
## blamed brock california deploy
## 0.19 0.19 0.19 0.19
## dumped earthquake emailed embarrassing
## 0.19 0.19 0.19 0.19
## expire flat forth gathered
## 0.19 0.19 0.19 0.19
## heartstringsi homebrock jockeyed landing
## 0.19 0.19 0.19 0.19
## mortification navy onehow placessample
## 0.19 0.19 0.19 0.19
## responding sailorfrom shift stayed
## 0.19 0.19 0.19 0.19
## swallowing waitress withdrew yeah
## 0.19 0.19 0.19 0.19
## hes mysteries famous none
## 0.18 0.18 0.17 0.17
## shy turns massive stands
## 0.17 0.17 0.17 0.17
## stranded bat bet bookthis
## 0.17 0.17 0.17 0.17
## brief buying daniels hits
## 0.17 0.17 0.17 0.17
## jack locked major mary
## 0.17 0.17 0.17 0.17
## oldfashioned single standalone starring
## 0.17 0.17 0.17 0.17
## titles wit sucker action
## 0.17 0.17 0.17 0.16
## masculine buck sometimes worst
## 0.16 0.16 0.16 0.16
## short least point heroine
## 0.15 0.15 0.15 0.14
## installment collection isnt plot
## 0.14 0.14 0.14 0.13
## voice course kind god
## 0.13 0.13 0.13 0.13
## ended lords accident finished
## 0.13 0.13 0.13 0.13
## fight double related wow
## 0.13 0.13 0.13 0.13
## board draws ones reality
## 0.13 0.13 0.13 0.13
## safe section pulled daily
## 0.13 0.13 0.13 0.13
## drew friendship mystery suspense
## 0.13 0.13 0.12 0.12
## installments anticipation misunderstanding spoiler
## 0.12 0.12 0.12 0.12
## withthis part lesson listened
## 0.12 0.12 0.12 0.12
## passing challenge threat jesse
## 0.12 0.12 0.12 0.12
## successful underdogs needs dundee
## 0.12 0.12 0.12 0.12
## everydaa everydaysituations fillers hung
## 0.12 0.12 0.12 0.12
## idaho ina mundane plotinteresting
## 0.12 0.12 0.12 0.12
## acceptunless assaulted confusing coponce
## 0.12 0.12 0.12 0.12
## decision dumps duty initial
## 0.12 0.12 0.12 0.12
## intimate julie littering peeve
## 0.12 0.12 0.12 0.12
## pet positioned window addicted
## 0.12 0.12 0.12 0.12
## compels dollars elders fasterthe
## 0.12 0.12 0.12 0.12
## feast fresh hitchcockian hopelessly
## 0.12 0.12 0.12 0.12
## intended leasti originality pacing
## 0.12 0.12 0.12 0.12
## premise psychos readingof strangers
## 0.12 0.12 0.12 0.12
## tackled victim wackos worded
## 0.12 0.12 0.12 0.12
## doubtful whoevers lunch broken
## 0.12 0.12 0.12 0.12
## offended raw tragic apocalypse
## 0.12 0.12 0.12 0.12
## rebuilding tempted visited adultsthe
## 0.12 0.12 0.12 0.12
## boys buildings construct deadly
## 0.12 0.12 0.12 0.12
## defend enters gather government
## 0.12 0.12 0.12 0.12
## itthis kills manage mountains
## 0.12 0.12 0.12 0.12
## nasty results surrounds feet
## 0.12 0.12 0.12 0.12
## hospital opening stated hoilday
## 0.12 0.12 0.12 0.12
## otherand reading something interested
## 0.12 0.11 0.11 0.11
## funny introduction turned nature
## 0.11 0.11 0.11 0.11
## say modern bit evil
## 0.11 0.11 0.10 0.10
## romance novella planet sets
## 0.10 0.10 0.10 0.10
## told
## 0.10
##
##
## Palabra: series
## $series
## knights progresses dragon knight
## 0.28 0.27 0.27 0.26
## introduced lords betterps combination
## 0.25 0.24 0.24 0.24
## dishes gushier ignoring lands
## 0.24 0.24 0.24 0.24
## meatier personallythis plow psycop
## 0.24 0.24 0.24 0.24
## ridiculously serving sexiness tick
## 0.24 0.24 0.24 0.24
## toread flaws delicious installment
## 0.24 0.24 0.23 0.23
## blood high books first
## 0.22 0.22 0.21 0.21
## lost range characters enthralled
## 0.21 0.21 0.20 0.20
## whole brotherhood called appears
## 0.19 0.19 0.19 0.19
## final adora look next
## 0.19 0.19 0.18 0.18
## ablaze adults alert angsts
## 0.18 0.18 0.18 0.18
## chills choices dante dips
## 0.18 0.18 0.18 0.18
## dominantly duncan flutter focuses
## 0.18 0.18 0.18 0.18
## forewarned inferno lolah malevolent
## 0.18 0.18 0.18 0.18
## megans orginality perfection predecessors
## 0.18 0.18 0.18 0.18
## progress reckoned reviting rippled
## 0.18 0.18 0.18 0.18
## salute scintillating spine stupid
## 0.18 0.18 0.18 0.18
## sub subsequent swoon undeniably
## 0.18 0.18 0.18 0.18
## valleys stumbled existsand neighbors
## 0.18 0.18 0.18 0.18
## rest scale togetherand wartrouble
## 0.18 0.18 0.18 0.18
## woe warfare comming underworld
## 0.18 0.18 0.18 0.18
## awakened closure eerie points
## 0.18 0.18 0.18 0.18
## realism reccomend storythere wounds
## 0.18 0.18 0.18 0.18
## zsadists prequel sampling acidic
## 0.18 0.18 0.18 0.18
## anne arrives beasts bedding
## 0.18 0.18 0.18 0.18
## boasts bolts bonded capable
## 0.18 0.18 0.18 0.18
## controlled courageous crossbow darian
## 0.18 0.18 0.18 0.18
## darius defect deranged diamondtipped
## 0.18 0.18 0.18 0.18
## discerns draconia dragonriders eviltwo
## 0.18 0.18 0.18 0.18
## fearing features flaming former
## 0.18 0.18 0.18 0.18
## gradually grave healer injuries
## 0.18 0.18 0.18 0.18
## jared kelzy kingdoms latter
## 0.18 0.18 0.18 0.18
## likely lucan magically mated
## 0.18 0.18 0.18 0.18
## matesthis mccaffreys medieval neighouring
## 0.18 0.18 0.18 0.18
## nico odds openly othersbelora
## 0.18 0.18 0.18 0.18
## palace peril pern piercing
## 0.18 0.18 0.18 0.18
## prince requires resembles resting
## 0.18 0.18 0.18 0.18
## saved scales scarce secrets
## 0.18 0.18 0.18 0.18
## seriously serpentine skithdron skithdrons
## 0.18 0.18 0.18 0.18
## skiths solitary speech spit
## 0.18 0.18 0.18 0.18
## suddenly sympathetic thereby threesomes
## 0.18 0.18 0.18 0.18
## venerai venom venomous waged
## 0.18 0.18 0.18 0.18
## warn warned wellimagined wellmeaning
## 0.18 0.18 0.18 0.18
## willingly witnessed central comei
## 0.18 0.18 0.18 0.18
## demanded demented expand extended
## 0.18 0.18 0.18 0.18
## hob meaningful shapeshifter storyi
## 0.18 0.18 0.18 0.18
## tch wicked builds consists
## 0.18 0.18 0.18 0.18
## counted courageousthe dauntlessthe desperate
## 0.18 0.18 0.18 0.18
## displace epic fearlessthe fleet
## 0.18 0.18 0.18 0.18
## frontier geary genius handful
## 0.18 0.18 0.18 0.18
## invincible locations ofthe opponents
## 0.18 0.18 0.18 0.18
## reasoned relentless relentlessandthe run
## 0.18 0.18 0.18 0.18
## seemingly serieseach seriesthe standard
## 0.18 0.18 0.18 0.18
## syndics tactical tangible universethe
## 0.18 0.18 0.18 0.18
## valiantthe victorious forward actually
## 0.18 0.18 0.17 0.17
## paranormal mate heal relationship
## 0.17 0.17 0.17 0.16
## another common fascinated sure
## 0.16 0.16 0.16 0.16
## angels beneficial thus upcoming
## 0.16 0.16 0.16 0.16
## stand withthis yet supernatural
## 0.16 0.16 0.16 0.16
## border lair castillo developed
## 0.16 0.16 0.16 0.16
## guessing hopes shelf ultimate
## 0.16 0.16 0.16 0.16
## vic awaiting brief standalone
## 0.16 0.16 0.16 0.16
## partner usually wounded fifth
## 0.16 0.16 0.16 0.16
## partners king buy alpha
## 0.16 0.15 0.15 0.15
## already masculine three woman
## 0.15 0.15 0.15 0.15
## havent risks antagonist alliance
## 0.15 0.15 0.15 0.15
## love become beyond involved
## 0.14 0.14 0.14 0.14
## hooked although youll captain
## 0.14 0.14 0.14 0.14
## order watching second turns
## 0.14 0.13 0.13 0.13
## whats spot jordan play
## 0.13 0.13 0.13 0.13
## close going well character
## 0.13 0.12 0.12 0.12
## fact justice ends flight
## 0.12 0.12 0.12 0.12
## maiden struggles point toes
## 0.12 0.12 0.12 0.12
## lord introduces gain decides
## 0.12 0.12 0.12 0.12
## darc favorites enjoyment mostly
## 0.12 0.12 0.12 0.12
## fully keep highly novels
## 0.11 0.11 0.11 0.11
## looked looking ruler went
## 0.11 0.11 0.11 0.11
## romance away give installments
## 0.11 0.11 0.11 0.11
## alone anticipation change famous
## 0.11 0.11 0.11 0.11
## heroine misunderstanding none shy
## 0.11 0.11 0.11 0.11
## spoiler young shifter deeper
## 0.11 0.11 0.11 0.11
## jumps vampire stands lovable
## 0.11 0.11 0.11 0.11
## rounded cheating daggar thrones
## 0.11 0.11 0.11 0.11
## speak becomes kaylee conspiracy
## 0.11 0.11 0.11 0.11
## important role continuation grow
## 0.11 0.11 0.11 0.11
## dive journey ruin baited
## 0.11 0.11 0.11 0.11
## mature cards meanwhile duchess
## 0.11 0.11 0.11 0.11
## inconvenient merrills stjohns bianca
## 0.11 0.11 0.11 0.11
## threw gruesome falling hear
## 0.11 0.11 0.11 0.11
## fascinating adored impatiently tootheir
## 0.11 0.11 0.11 0.11
## length rating endingi immerse
## 0.11 0.11 0.11 0.11
## interacts royal albeit rooting
## 0.11 0.11 0.11 0.11
## wide leopard town content
## 0.11 0.11 0.11 0.11
## destination location opera six
## 0.11 0.11 0.11 0.11
## aunt burke foundation lays
## 0.11 0.11 0.11 0.11
## mainly outsiders protects rachel
## 0.11 0.11 0.11 0.11
## rachels shifters totem unless
## 0.11 0.11 0.11 0.11
## anxiously arc blog customer
## 0.11 0.11 0.11 0.11
## expecting horrible lark preorder
## 0.11 0.11 0.11 0.11
## rarely updates ware website
## 0.11 0.11 0.11 0.11
## bobby catching cedar celebs
## 0.11 0.11 0.11 0.11
## chess cove dizziness hop
## 0.11 0.11 0.11 0.11
## incorporation macomber player settling
## 0.11 0.11 0.11 0.11
## slice teri reason space
## 0.11 0.11 0.10 0.10
## daughter filled least took
## 0.10 0.10 0.10 0.10
## dragons particular told
## 0.10 0.10 0.10
##
##
## Palabra: great
## $great
## kendle lamong contemporary premis regency
## 0.22 0.22 0.22 0.22 0.22
## storyread else players society place
## 0.22 0.21 0.20 0.16 0.16
## loud angry meet chief mike
## 0.15 0.14 0.14 0.14 0.14
## progressing youngest transported eagerly explained
## 0.14 0.14 0.14 0.14 0.14
## itthe mating okayi patient peacefully
## 0.14 0.14 0.14 0.14 0.14
## rushed rushing substory successfully wonderfuli
## 0.14 0.14 0.14 0.14 0.14
## bad smashing storylines runs lacy
## 0.14 0.14 0.14 0.14 0.14
## nick rugged sweetheart womans effects
## 0.14 0.14 0.14 0.14 0.14
## prolific references considering diseasei fitzgeralds
## 0.14 0.14 0.14 0.14 0.14
## gatsby intoxication mental nuances readingall
## 0.14 0.14 0.14 0.14 0.14
## seldom shorter unpleasant bits naughty
## 0.14 0.14 0.14 0.14 0.14
## rolled writen alcoves ambiancein apprehensionbut
## 0.14 0.14 0.14 0.14 0.14
## break bretts cared dirty downstairs
## 0.14 0.14 0.14 0.14 0.14
## familiarity fari flirtation friendly hello
## 0.14 0.14 0.14 0.14 0.14
## inhibitions itbut lack mere mfm
## 0.14 0.14 0.14 0.14 0.14
## mingle mmf mortal overhead placeand
## 0.14 0.14 0.14 0.14 0.14
## playfulness puts relatively respectively shower
## 0.14 0.14 0.14 0.14 0.14
## smarty unbearably underestimate vampirethis walkways
## 0.14 0.14 0.14 0.14 0.14
## betreyal couragious criptic familylove forgive
## 0.14 0.14 0.14 0.14 0.14
## luc lucs paini skye sompalpable
## 0.14 0.14 0.14 0.14 0.14
## rhage anywhere chieftains info bobby
## 0.14 0.14 0.14 0.14 0.14
## catching cedar celebs chess cove
## 0.14 0.14 0.14 0.14 0.14
## dizziness hop incorporation macomber player
## 0.14 0.14 0.14 0.14 0.14
## settling slice teri human lisa
## 0.14 0.14 0.14 0.13 0.13
## edge right brett scene addition
## 0.12 0.12 0.12 0.12 0.12
## think ward mars moments steamy
## 0.11 0.11 0.11 0.11 0.11
## calls storyline agree enjoyment followup
## 0.11 0.11 0.11 0.11 0.11
## definitely finding solve romances job
## 0.10 0.10 0.10 0.10 0.10
## guys masterpiece talk smart
## 0.10 0.10 0.10 0.10
##
##
## Palabra: characters
## $characters
## main supernatural role believable
## 0.28 0.28 0.28 0.25
## antagonist central comei demanded
## 0.24 0.24 0.24 0.24
## demented expand extended hob
## 0.24 0.24 0.24 0.24
## meaningful shapeshifter storyi tch
## 0.24 0.24 0.24 0.24
## wicked play gray telling
## 0.24 0.23 0.22 0.22
## uncertainty hand wide series
## 0.22 0.22 0.22 0.20
## follow well descriptions immediately
## 0.20 0.19 0.19 0.19
## journey introduced going ability
## 0.19 0.19 0.18 0.18
## bring particularly meet often
## 0.18 0.18 0.18 0.18
## amazed authors exciting steve
## 0.18 0.17 0.17 0.17
## progresses others emotionally fist
## 0.17 0.17 0.17 0.17
## introduces personal mostly imagine
## 0.17 0.17 0.17 0.17
## bit way actions fascinated
## 0.16 0.16 0.16 0.16
## identify peek went thus
## 0.16 0.16 0.16 0.16
## little young sunset court
## 0.16 0.16 0.16 0.16
## drink speak brief knight
## 0.16 0.16 0.16 0.16
## respected details fleshing ruin
## 0.16 0.16 0.16 0.16
## begins gruesome rating endingi
## 0.16 0.16 0.16 0.16
## betrayed albeit rooting chuckling
## 0.16 0.16 0.16 0.16
## invested local captivated honesty
## 0.16 0.16 0.16 0.16
## forward look plot another
## 0.15 0.15 0.15 0.15
## definitely common adapted bled
## 0.15 0.15 0.15 0.15
## build charactersthere coat connect
## 0.15 0.15 0.15 0.15
## contents darkred detailed dots
## 0.15 0.15 0.15 0.15
## expectedif extra fluff furiously
## 0.15 0.15 0.15 0.15
## half hated middle nails
## 0.15 0.15 0.15 0.15
## novelby opinions paint planks
## 0.15 0.15 0.15 0.15
## poorly rain reach reacted
## 0.15 0.15 0.15 0.15
## reveals rusty seat strained
## 0.15 0.15 0.15 0.15
## streaks transport twistsi utilized
## 0.15 0.15 0.15 0.15
## warped writingthe character approach
## 0.15 0.15 0.15 0.15
## exchange flying futuresagain grows
## 0.15 0.15 0.15 0.15
## hang hawks mistakes sachin
## 0.15 0.15 0.15 0.15
## storiesi undeniable visit lovely
## 0.15 0.15 0.15 0.15
## lovable rounded beenwaiting containssexual
## 0.15 0.15 0.15 0.15
## dunne dunnes familyespecially feud
## 0.15 0.15 0.15 0.15
## goodfellow howeversome interact kaitlynnthe
## 0.15 0.15 0.15 0.15
## leos malmayne malmaynes robin
## 0.15 0.15 0.15 0.15
## rubyhalloway whereinteresting wont anticipated
## 0.15 0.15 0.15 0.15
## around belong blending bravery
## 0.15 0.15 0.15 0.15
## clans coping dreamlike endon
## 0.15 0.15 0.15 0.15
## factions fiercely finest folklore
## 0.15 0.15 0.15 0.15
## grounds hauntingly howsteve humanity
## 0.15 0.15 0.15 0.15
## legends ley lights loyal
## 0.15 0.15 0.15 0.15
## maintain member mirroring myths
## 0.15 0.15 0.15 0.15
## nightmares peeks predators realm
## 0.15 0.15 0.15 0.15
## selfrespect shroud sleep speed
## 0.15 0.15 0.15 0.15
## straddle superhuman surround traditions
## 0.15 0.15 0.15 0.15
## unimportant veils villain vital
## 0.15 0.15 0.15 0.15
## weak whilelongclaws worldbuildingmy drawn
## 0.15 0.15 0.15 0.15
## badge bunny fireman interestingim
## 0.15 0.15 0.15 0.15
## ramagos tonya attebery characteristics
## 0.15 0.15 0.15 0.15
## crafted develops engage ensured
## 0.15 0.15 0.15 0.15
## evolved prefer readervery slapdash
## 0.15 0.15 0.15 0.15
## blends outloud satisfies stake
## 0.15 0.15 0.15 0.15
## anymore basic blasters calling
## 0.15 0.15 0.15 0.15
## cannon commandos competent comrades
## 0.15 0.15 0.15 0.15
## dead defeat dispatch downthere
## 0.15 0.15 0.15 0.15
## elaborate elite empire enforce
## 0.15 0.15 0.15 0.15
## faceless fighters fights file
## 0.15 0.15 0.15 0.15
## fodder fortress freed george
## 0.15 0.15 0.15 0.15
## gripe gun headour hindrance
## 0.15 0.15 0.15 0.15
## imprisoned infiltrate inwhere iron
## 0.15 0.15 0.15 0.15
## justicelater justicethe legion lucas
## 0.15 0.15 0.15 0.15
## multidimensional nostalgia offered ordersspoilers
## 0.15 0.15 0.15 0.15
## plant politics prisoners rank
## 0.15 0.15 0.15 0.15
## rebel rebels rule ruling
## 0.15 0.15 0.15 0.15
## sake scratch sharpshooting specialties
## 0.15 0.15 0.15 0.15
## spoilersso spoilerszahn stronghold talents
## 0.15 0.15 0.15 0.15
## themend thrawns timothy troopers
## 0.15 0.15 0.15 0.15
## troops vader vaders warlord
## 0.15 0.15 0.15 0.15
## warlords zahns disability income
## 0.15 0.15 0.15 0.15
## inventory preferred flaws asian
## 0.15 0.15 0.15 0.15
## braid changing complexity conscience
## 0.15 0.15 0.15 0.15
## damaged explored gorgeous hair
## 0.15 0.15 0.15 0.15
## hangs haven jae kelly
## 0.15 0.15 0.15 0.15
## kinds oooh struggling thick
## 0.15 0.15 0.15 0.15
## tree trunk wrist bobby
## 0.15 0.15 0.15 0.15
## catching cedar celebs chess
## 0.15 0.15 0.15 0.15
## cove dizziness hop incorporation
## 0.15 0.15 0.15 0.15
## macomber player settling slice
## 0.15 0.15 0.15 0.15
## teri type loved storm
## 0.15 0.14 0.14 0.14
## together received paranormal liked
## 0.14 0.14 0.14 0.14
## meets personalities lines feelings
## 0.14 0.14 0.14 0.14
## place throughout king start
## 0.14 0.14 0.13 0.13
## afraid complex help talent
## 0.13 0.13 0.13 0.13
## world leo vampire marry
## 0.13 0.13 0.13 0.13
## survival dragon knights tale
## 0.13 0.13 0.13 0.13
## skills relationship something highly
## 0.13 0.12 0.12 0.12
## find reader unexpected wait
## 0.12 0.12 0.12 0.12
## wonderful fun man late
## 0.12 0.12 0.12 0.12
## aka strong imagination crazy
## 0.12 0.12 0.12 0.12
## seems safe worlds usually
## 0.12 0.12 0.12 0.12
## mallery agree desire appears
## 0.12 0.12 0.12 0.12
## enjoyment loud phenomenal mystery
## 0.12 0.12 0.12 0.11
## made really writing film
## 0.11 0.11 0.11 0.11
## inside lot seeing easy
## 0.11 0.11 0.11 0.11
## boy action daughter adults
## 0.11 0.11 0.11 0.11
## pace line fantastic issues
## 0.11 0.11 0.11 0.11
## high dark battle longclaws
## 0.11 0.11 0.11 0.11
## later simply solid satisfying
## 0.11 0.11 0.11 0.11
## range first couldnt edge
## 0.11 0.10 0.10 0.10
## suspense absolutely able writers
## 0.10 0.10 0.10 0.10
## give change yet
## 0.10 0.10 0.10
##
##
## Palabra: reading
## $reading
## hes agreement angleall attitude
## 0.30 0.24 0.24 0.24
## bang bloody career chillingthe
## 0.24 0.24 0.24 0.24
## compelling concept dishing disturb
## 0.24 0.24 0.24 0.24
## drop dying equally feathers
## 0.24 0.24 0.24 0.24
## flash generally genres gritty
## 0.24 0.24 0.24 0.24
## hardboiled inthe isbut itanother
## 0.24 0.24 0.24 0.24
## jacqueline jokes led lessright
## 0.24 0.24 0.24 0.24
## majorly meaty nighttheres origin
## 0.24 0.24 0.24 0.24
## parts phineas proof publishing
## 0.24 0.24 0.24 0.24
## rollingin ruffling saving screaming
## 0.24 0.24 0.24 0.24
## selling separated shock sock
## 0.24 0.24 0.24 0.24
## sold sour stuffyoure survivor
## 0.24 0.24 0.24 0.24
## symbios treated troutt unpredictable
## 0.24 0.24 0.24 0.24
## whiskey era victorian youback
## 0.24 0.24 0.24 0.24
## youenjoy youre planned bat
## 0.24 0.23 0.22 0.22
## crime intro clever forward
## 0.22 0.22 0.21 0.19
## ebooks horror sets wasnt
## 0.18 0.18 0.18 0.17
## finished regular reality stories
## 0.17 0.17 0.17 0.16
## introduction massive stands malleryi
## 0.16 0.16 0.16 0.16
## susanadeline triologies stranded awaiting
## 0.16 0.16 0.16 0.16
## cheating daggar thrones reminded
## 0.16 0.16 0.16 0.16
## bet bookthis brief buying
## 0.16 0.16 0.16 0.16
## fair hits include locked
## 0.16 0.16 0.16 0.16
## major mary oldfashioned single
## 0.16 0.16 0.16 0.16
## standalone starring titles wit
## 0.16 0.16 0.16 0.16
## antonios aroused birthday business
## 0.16 0.16 0.16 0.16
## celebration dirk ear guests
## 0.16 0.16 0.16 0.16
## invited mascaraedbdsm mask masks
## 0.16 0.16 0.16 0.16
## partial party performance rsvp
## 0.16 0.16 0.16 0.16
## scorcher secrecy suggestive walks
## 0.16 0.16 0.16 0.16
## wearing whispering prequel sampling
## 0.16 0.16 0.16 0.16
## doubtful whoevers currently prolific
## 0.16 0.16 0.16 0.16
## references bargain natural grand
## 0.16 0.16 0.16 0.16
## nights slam spots vote
## 0.16 0.16 0.16 0.16
## blossoming boating caution dogstacy
## 0.16 0.16 0.16 0.16
## endedjake fishing gina headed
## 0.16 0.16 0.16 0.16
## hide hinson identities incident
## 0.16 0.16 0.16 0.16
## jake libraryif limelight media
## 0.16 0.16 0.16 0.16
## nascar pastboth recognize somehow
## 0.16 0.16 0.16 0.16
## stacy wilkinsharlequin blow othersit
## 0.16 0.16 0.16 0.16
## presidenti keep wow enjoyed
## 0.16 0.15 0.15 0.14
## point daniels familiar mysteries
## 0.14 0.14 0.14 0.14
## connected first take antonio
## 0.14 0.13 0.13 0.13
## lily complete cabin neighbor
## 0.13 0.13 0.13 0.13
## experience sure room planning
## 0.12 0.12 0.12 0.12
## got justice held sitting
## 0.12 0.12 0.12 0.12
## sister havent account black
## 0.12 0.12 0.12 0.12
## gotten related light kings
## 0.12 0.12 0.12 0.12
## board draws money safe
## 0.12 0.12 0.12 0.12
## say section sometimes stephen
## 0.12 0.12 0.12 0.12
## thriller inexpensive advise involving
## 0.12 0.12 0.12 0.12
## enjoyment pure books good
## 0.12 0.12 0.11 0.11
## look kind vampire collection
## 0.11 0.11 0.11 0.11
## staying jack stuff jane
## 0.11 0.11 0.11 0.11
## write ebook especially something
## 0.11 0.10 0.10 0.10
## laugh time quickly set
## 0.10 0.10 0.10 0.10
## didnt certainly care getting
## 0.10 0.10 0.10 0.10
## place
## 0.10
##
##
## Palabra: really
## $really
## point met major starring
## 0.30 0.29 0.27 0.27
## needs feet got didnt
## 0.27 0.27 0.25 0.25
## knew name man everyone
## 0.24 0.24 0.24 0.24
## grandparents morgan take agreement
## 0.24 0.24 0.23 0.23
## angleall attitude bang bloody
## 0.23 0.23 0.23 0.23
## career chillingthe compelling concept
## 0.23 0.23 0.23 0.23
## dishing disturb drop dying
## 0.23 0.23 0.23 0.23
## equally feathers flash generally
## 0.23 0.23 0.23 0.23
## genres gritty hardboiled hes
## 0.23 0.23 0.23 0.23
## inthe isbut itanother jacqueline
## 0.23 0.23 0.23 0.23
## jokes led lessright majorly
## 0.23 0.23 0.23 0.23
## meaty nighttheres origin parts
## 0.23 0.23 0.23 0.23
## phineas proof publishing rollingin
## 0.23 0.23 0.23 0.23
## ruffling saving screaming selling
## 0.23 0.23 0.23 0.23
## separated shock sock sold
## 0.23 0.23 0.23 0.23
## sour stuffyoure survivor symbios
## 0.23 0.23 0.23 0.23
## treated troutt unpredictable whiskey
## 0.23 0.23 0.23 0.23
## wanted ambulance appointment aruba
## 0.23 0.23 0.23 0.23
## asked barged body brice
## 0.23 0.23 0.23 0.23
## broke bryan bryans budget
## 0.23 0.23 0.23 0.23
## cailborn chicago contacting contractions
## 0.23 0.23 0.23 0.23
## couch credit cuts digger
## 0.23 0.23 0.23 0.23
## dillon district laid mess
## 0.23 0.23 0.23 0.23
## office painful parents pointed
## 0.23 0.23 0.23 0.23
## pregnant reply retreat sectary
## 0.23 0.23 0.23 0.23
## stood teacher trips trusted
## 0.23 0.23 0.23 0.23
## wealthy week acceptunless assaulted
## 0.23 0.23 0.23 0.23
## confusing coponce decision dumps
## 0.23 0.23 0.23 0.23
## duty initial intimate julie
## 0.23 0.23 0.23 0.23
## littering peeve pet positioned
## 0.23 0.23 0.23 0.23
## window toothache advice arms
## 0.23 0.23 0.23 0.23
## blamed brock california deploy
## 0.23 0.23 0.23 0.23
## dumped earthquake emailed embarrassing
## 0.23 0.23 0.23 0.23
## expire flat forth gathered
## 0.23 0.23 0.23 0.23
## heartstringsi homebrock jockeyed landing
## 0.23 0.23 0.23 0.23
## mortification navy onehow placessample
## 0.23 0.23 0.23 0.23
## responding sailorfrom shift stayed
## 0.23 0.23 0.23 0.23
## swallowing waitress withdrew yeah
## 0.23 0.23 0.23 0.23
## home said turned thought
## 0.22 0.22 0.22 0.22
## call youre picked ended
## 0.22 0.22 0.22 0.21
## stands double gives bat
## 0.21 0.21 0.21 0.21
## brief buying fair intro
## 0.21 0.21 0.21 0.21
## jack stephen stuff wit
## 0.21 0.21 0.21 0.21
## busy died gold music
## 0.21 0.21 0.21 0.21
## rooted son tall agree
## 0.21 0.21 0.21 0.21
## ruse spoilers honorable opens
## 0.21 0.21 0.21 0.21
## emotions adapt hospital good
## 0.21 0.21 0.21 0.20
## past something seen sweet
## 0.20 0.20 0.20 0.20
## turns military clever handsome
## 0.20 0.20 0.20 0.20
## inside family room told
## 0.19 0.19 0.19 0.19
## ebooks stories writers liked
## 0.18 0.18 0.18 0.18
## crime well enjoyed another
## 0.18 0.17 0.17 0.17
## together let war situation
## 0.17 0.17 0.17 0.17
## horror intrigue face storm
## 0.17 0.17 0.17 0.16
## afraid time kind finished
## 0.16 0.16 0.16 0.16
## differences collection related kings
## 0.16 0.16 0.16 0.16
## board draws safe water
## 0.16 0.16 0.16 0.16
## place shortly entire make
## 0.16 0.16 0.15 0.15
## manages work cute person
## 0.15 0.15 0.15 0.15
## altogether attitudes biases blue
## 0.15 0.15 0.15 0.15
## button captures civil historically
## 0.15 0.15 0.15 0.15
## louis mustang purely sympathies
## 0.15 0.15 0.15 0.15
## unfold viewpoint leaving massive
## 0.15 0.15 0.15 0.15
## chapter stranded listened felt
## 0.15 0.15 0.15 0.15
## reminded seems bet bookthis
## 0.15 0.15 0.15 0.15
## hits include locked mary
## 0.15 0.15 0.15 0.15
## oldfashioned single standalone titles
## 0.15 0.15 0.15 0.15
## around passing compared accepted
## 0.15 0.15 0.15 0.15
## cards conference packed shed
## 0.15 0.15 0.15 0.15
## truth adaptable affordable budding
## 0.15 0.15 0.15 0.15
## couplesbut extinction females level
## 0.15 0.15 0.15 0.15
## maids maturity plausiblei realise
## 0.15 0.15 0.15 0.15
## jesse ship catsto fairbanks
## 0.15 0.15 0.15 0.15
## horrifying indescribable courage door
## 0.15 0.15 0.15 0.15
## dress furious hasnt tomboygirl
## 0.15 0.15 0.15 0.15
## worksthe actionwhile adds alongside
## 0.15 0.15 0.15 0.15
## armada biology boba boots
## 0.15 0.15 0.15 0.15
## comics continued creditsthe depths
## 0.15 0.15 0.15 0.15
## dilemma enemy excited fett
## 0.15 0.15 0.15 0.15
## floor fought galaxy gaps
## 0.15 0.15 0.15 0.15
## gunning honor invaders invasion
## 0.15 0.15 0.15 0.15
## itspoilers jedi karen lying
## 0.15 0.15 0.15 0.15
## mandalore mandalorian mandalorians mandos
## 0.15 0.15 0.15 0.15
## master masterend mobilize oozing
## 0.15 0.15 0.15 0.15
## parley pit plans population
## 0.15 0.15 0.15 0.15
## pulsing realizes reconsider republic
## 0.15 0.15 0.15 0.15
## sarlaac send signed slime
## 0.15 0.15 0.15 0.15
## slip sneak spoilersi spoilersthis
## 0.15 0.15 0.15 0.15
## squishing theyll travis traviss
## 0.15 0.15 0.15 0.15
## visuals vong vongs walked
## 0.15 0.15 0.15 0.15
## walking walls wellduring wises
## 0.15 0.15 0.15 0.15
## wraps wreck alex amount
## 0.15 0.15 0.15 0.15
## miller mistaken street differed
## 0.15 0.15 0.15 0.15
## faithful garland judy motion
## 0.15 0.15 0.15 0.15
## plenty rinkitink broken betrayed
## 0.15 0.15 0.15 0.15
## tragic hailey sucker visited
## 0.15 0.15 0.15 0.15
## adultsthe boys buildings construct
## 0.15 0.15 0.15 0.15
## deadly defend enters gather
## 0.15 0.15 0.15 0.15
## government itthis kills manage
## 0.15 0.15 0.15 0.15
## mountains nasty results surrounds
## 0.15 0.15 0.15 0.15
## opening stated anymore basic
## 0.15 0.15 0.15 0.15
## blasters calling cannon commandos
## 0.15 0.15 0.15 0.15
## competent comrades dead defeat
## 0.15 0.15 0.15 0.15
## dispatch downthere elaborate elite
## 0.15 0.15 0.15 0.15
## empire enforce faceless fighters
## 0.15 0.15 0.15 0.15
## fights file fodder fortress
## 0.15 0.15 0.15 0.15
## freed george gripe gun
## 0.15 0.15 0.15 0.15
## headour hindrance imprisoned infiltrate
## 0.15 0.15 0.15 0.15
## inwhere iron justicelater justicethe
## 0.15 0.15 0.15 0.15
## legion local lucas multidimensional
## 0.15 0.15 0.15 0.15
## nostalgia offered ordersspoilers plant
## 0.15 0.15 0.15 0.15
## politics prisoners rank rebel
## 0.15 0.15 0.15 0.15
## rebels rule ruling sake
## 0.15 0.15 0.15 0.15
## scratch sharpshooting specialties spoilersso
## 0.15 0.15 0.15 0.15
## spoilerszahn strike stronghold talents
## 0.15 0.15 0.15 0.15
## themend thrawns timothy troopers
## 0.15 0.15 0.15 0.15
## troops vader vaders warlord
## 0.15 0.15 0.15 0.15
## warlords zahns era victorian
## 0.15 0.15 0.15 0.15
## youback youenjoy glimpse type
## 0.15 0.15 0.15 0.14
## film enjoy age anything
## 0.14 0.14 0.14 0.14
## part meet fist planet
## 0.14 0.14 0.14 0.14
## see laugh never original
## 0.13 0.13 0.13 0.13
## turn difference stand accident
## 0.13 0.13 0.13 0.13
## star might trip came
## 0.13 0.13 0.13 0.13
## brother people deal across
## 0.13 0.13 0.13 0.13
## familiar setting brothers known
## 0.13 0.13 0.13 0.13
## jacobs teens ways mine
## 0.13 0.13 0.13 0.13
## asks nothing drew skills
## 0.13 0.13 0.13 0.13
## want voice keep fan
## 0.12 0.12 0.12 0.12
## greatest western saw filled
## 0.12 0.12 0.12 0.12
## justice shes onto month
## 0.12 0.12 0.12 0.12
## wars game boss bound
## 0.12 0.12 0.12 0.12
## wow getting reality section
## 0.12 0.12 0.12 0.12
## sometimes pulled touched keeping
## 0.12 0.12 0.12 0.12
## daily back head complain
## 0.12 0.12 0.12 0.12
## inexpensive camp retired worst
## 0.12 0.12 0.12 0.12
## friendship know characters course
## 0.12 0.11 0.11 0.11
## earth shows even heart
## 0.11 0.11 0.11 0.11
## introduction vampire issues price
## 0.11 0.11 0.11 0.11
## immediately leave money became
## 0.11 0.11 0.11 0.11
## married learned simply right
## 0.11 0.11 0.11 0.10
## scifi heroine main picture
## 0.10 0.10 0.10 0.10
## clean say
## 0.10 0.10
##
##
## Palabra: will
## $will
## lines role affected aliens
## 0.33 0.33 0.32 0.32
## colony concentrates earthlings formerly
## 0.32 0.32 0.32 0.32
## friendlyauthor headings insignificant nonfriendly
## 0.32 0.32 0.32 0.32
## planets superior traverse wont
## 0.32 0.32 0.32 0.32
## anticipated belong blending bravery
## 0.32 0.32 0.32 0.32
## clans coping dreamlike endon
## 0.32 0.32 0.32 0.32
## factions fiercely finest folklore
## 0.32 0.32 0.32 0.32
## grounds hauntingly howsteve humanity
## 0.32 0.32 0.32 0.32
## ley lights loyal maintain
## 0.32 0.32 0.32 0.32
## member mirroring myths nightmares
## 0.32 0.32 0.32 0.32
## peeks predators realm selfrespect
## 0.32 0.32 0.32 0.32
## shroud sleep speed straddle
## 0.32 0.32 0.32 0.32
## superhuman surround traditions unimportant
## 0.32 0.32 0.32 0.32
## veils villain vital weak
## 0.32 0.32 0.32 0.32
## whilelongclaws worldbuildingmy survival survive
## 0.32 0.32 0.31 0.30
## seems tale battle legends
## 0.28 0.28 0.28 0.28
## bring happens everyday cross
## 0.27 0.27 0.27 0.27
## individuals leader stay ruin
## 0.27 0.27 0.27 0.27
## give style constant personal
## 0.26 0.26 0.26 0.26
## clan longclaws scared away
## 0.25 0.25 0.24 0.23
## beware blew chances charlie
## 0.23 0.23 0.23 0.23
## cruise dates dinner eric
## 0.23 0.23 0.23 0.23
## freaking handylol hott interrogated
## 0.23 0.23 0.23 0.23
## occurred rafael regret strongest
## 0.23 0.23 0.23 0.23
## bear comforting donating ease
## 0.23 0.23 0.23 0.23
## hopefully kathi organs scar
## 0.23 0.23 0.23 0.23
## somewhere supreme brought managed
## 0.23 0.23 0.22 0.22
## intelligence refer future main
## 0.22 0.21 0.21 0.21
## imaginative people tangled speak
## 0.21 0.21 0.21 0.21
## behind demons hell important
## 0.21 0.21 0.21 0.21
## impossible passing respected separate
## 0.21 0.21 0.21 0.21
## win wondered compared guy
## 0.21 0.21 0.21 0.21
## passage becoming earth note
## 0.21 0.21 0.20 0.20
## shattering connection simon loss
## 0.20 0.20 0.20 0.20
## realize play reason stars
## 0.19 0.19 0.18 0.18
## find pay name fact
## 0.18 0.18 0.18 0.18
## possible often feelings beloved
## 0.18 0.18 0.18 0.18
## steve mars super many
## 0.17 0.17 0.17 0.17
## otherwise beautiful unknown bored
## 0.17 0.17 0.17 0.17
## crazy worlds whenever think
## 0.17 0.17 0.17 0.16
## storm learn humans take
## 0.16 0.16 0.16 0.16
## almost indian antagonist never
## 0.16 0.16 0.16 0.15
## writing forget uncertainty world
## 0.15 0.15 0.15 0.15
## able students gets pace
## 0.15 0.15 0.15 0.15
## lesson guys dana leprechaun
## 0.15 0.15 0.15 0.15
## marie quirky amazes angers
## 0.15 0.15 0.15 0.15
## areas avenged barbarians belgian
## 0.15 0.15 0.15 0.15
## brutes childish comprehension destruction
## 0.15 0.15 0.15 0.15
## europe expansion french german
## 0.15 0.15 0.15 0.15
## germans germany happenauthor levelled
## 0.15 0.15 0.15 0.15
## murderers nation periodit perpetrated
## 0.15 0.15 0.15 0.15
## psyche rear retreating retribution
## 0.15 0.15 0.15 0.15
## ridicule romanticizes tours trenches
## 0.15 0.15 0.15 0.15
## unwanted viewing vilifies wanton
## 0.15 0.15 0.15 0.15
## wellwritten aloneread chocolate gravyhoping
## 0.15 0.15 0.15 0.15
## hungry kicks messing minions
## 0.15 0.15 0.15 0.15
## snob snobby brief major
## 0.15 0.15 0.15 0.15
## finds runs tried built
## 0.15 0.15 0.15 0.15
## decides amelia recapture favyou
## 0.15 0.15 0.15 0.15
## rating central comei demanded
## 0.15 0.15 0.15 0.15
## demented expand extended hob
## 0.15 0.15 0.15 0.15
## meaningful rooting shapeshifter storyi
## 0.15 0.15 0.15 0.15
## tch wicked wide markhat
## 0.15 0.15 0.15 0.15
## anymore basic blasters calling
## 0.15 0.15 0.15 0.15
## cannon commandos competent comrades
## 0.15 0.15 0.15 0.15
## dead defeat dispatch downthere
## 0.15 0.15 0.15 0.15
## elaborate elite empire enforce
## 0.15 0.15 0.15 0.15
## faceless fighters fights file
## 0.15 0.15 0.15 0.15
## fodder fortress freed george
## 0.15 0.15 0.15 0.15
## gripe gun headour hindrance
## 0.15 0.15 0.15 0.15
## imprisoned infiltrate inwhere iron
## 0.15 0.15 0.15 0.15
## justicelater justicethe legion lucas
## 0.15 0.15 0.15 0.15
## multidimensional nostalgia offered ordersspoilers
## 0.15 0.15 0.15 0.15
## plant politics prisoners rank
## 0.15 0.15 0.15 0.15
## rebel rebels rule ruling
## 0.15 0.15 0.15 0.15
## sake scratch sharpshooting specialties
## 0.15 0.15 0.15 0.15
## spoilersso spoilerszahn stronghold talents
## 0.15 0.15 0.15 0.15
## themend thrawns timothy troopers
## 0.15 0.15 0.15 0.15
## troops vader vaders warlord
## 0.15 0.15 0.15 0.15
## warlords zahns six asian
## 0.15 0.15 0.15 0.15
## braid changing complexity conscience
## 0.15 0.15 0.15 0.15
## damaged explored gorgeous hair
## 0.15 0.15 0.15 0.15
## hangs haven jae kelly
## 0.15 0.15 0.15 0.15
## kinds oooh struggling thick
## 0.15 0.15 0.15 0.15
## tree trunk wrist way
## 0.15 0.15 0.15 0.14
## someone particularly peek excellent
## 0.14 0.14 0.14 0.14
## character fan still promise
## 0.14 0.14 0.14 0.14
## yet issues fist strength
## 0.14 0.14 0.14 0.14
## extremely men can girl
## 0.14 0.14 0.13 0.13
## help two thus writers
## 0.13 0.13 0.13 0.13
## cause believe vampire ever
## 0.13 0.13 0.13 0.13
## job shocking sidhe military
## 0.13 0.13 0.13 0.13
## wanted drawn skills want
## 0.13 0.13 0.13 0.12
## going memories make sure
## 0.12 0.12 0.12 0.12
## lives adult boy creative
## 0.12 0.12 0.12 0.12
## enjoy confused giving live
## 0.12 0.12 0.12 0.12
## shows writer city young
## 0.12 0.12 0.12 0.12
## meet chapter game lord
## 0.12 0.12 0.12 0.12
## related leave safe disappointed
## 0.12 0.12 0.12 0.12
## survivors appears imagine love
## 0.12 0.12 0.12 0.11
## loved together doesnt better
## 0.11 0.11 0.11 0.11
## attention line might soon
## 0.11 0.11 0.11 0.11
## around accept married used
## 0.11 0.11 0.11 0.10
## big child deal
## 0.10 0.10 0.10
##
##
## Palabra: loved
## $loved
## drawn bore realistically asian braid
## 0.25 0.25 0.25 0.25 0.25
## changing complexity conscience damaged explored
## 0.25 0.25 0.25 0.25 0.25
## gorgeous hair hangs haven jae
## 0.25 0.25 0.25 0.25 0.25
## kelly kinds oooh struggling thick
## 0.25 0.25 0.25 0.25 0.25
## tree trunk wrist leader personal
## 0.25 0.25 0.25 0.23 0.23
## died let absolutely often started
## 0.21 0.20 0.20 0.20 0.20
## everyone flows emotionally issues pride
## 0.19 0.19 0.18 0.18 0.18
## safe morgan shortly uncertainty passing
## 0.18 0.18 0.18 0.17 0.17
## role mans wanted conference flowed
## 0.17 0.17 0.17 0.17 0.17
## built worked notice everytime town
## 0.17 0.17 0.17 0.17 0.17
## recover honesty way television victory
## 0.17 0.17 0.16 0.16 0.16
## man survival told anticipated belong
## 0.16 0.16 0.16 0.16 0.16
## blending bravery clans coping dreamlike
## 0.16 0.16 0.16 0.16 0.16
## endon factions fiercely finest folklore
## 0.16 0.16 0.16 0.16 0.16
## grounds hauntingly howsteve humanity ley
## 0.16 0.16 0.16 0.16 0.16
## lights loyal maintain member mirroring
## 0.16 0.16 0.16 0.16 0.16
## myths nightmares peeks predators realm
## 0.16 0.16 0.16 0.16 0.16
## selfrespect shroud sleep speed straddle
## 0.16 0.16 0.16 0.16 0.16
## superhuman surround traditions unimportant veils
## 0.16 0.16 0.16 0.16 0.16
## villain vital weak whilelongclaws worldbuildingmy
## 0.16 0.16 0.16 0.16 0.16
## amy bitchiness caitlin caitlins danes
## 0.16 0.16 0.16 0.16 0.16
## eamons gems mightve petty resulted
## 0.16 0.16 0.16 0.16 0.16
## spinoff stumble troubles wouldve ambulance
## 0.16 0.16 0.16 0.16 0.16
## appointment aruba asked barged body
## 0.16 0.16 0.16 0.16 0.16
## brice broke bryan bryans budget
## 0.16 0.16 0.16 0.16 0.16
## cailborn chicago contacting contractions couch
## 0.16 0.16 0.16 0.16 0.16
## credit cuts digger dillon district
## 0.16 0.16 0.16 0.16 0.16
## handsome laid mess office painful
## 0.16 0.16 0.16 0.16 0.16
## parents pointed pregnant reply retreat
## 0.16 0.16 0.16 0.16 0.16
## sectary stood teacher trips trusted
## 0.16 0.16 0.16 0.16 0.16
## wealthy week badge bunny fireman
## 0.16 0.16 0.16 0.16 0.16
## interestingim ramagos tonya awakened closure
## 0.16 0.16 0.16 0.16 0.16
## eerie points realism reccomend storythere
## 0.16 0.16 0.16 0.16 0.16
## wounds zsadists previews aunt burke
## 0.16 0.16 0.16 0.16 0.16
## foundation lays mainly outsiders protects
## 0.16 0.16 0.16 0.16 0.16
## rachel rachels shifters totem unless
## 0.16 0.16 0.16 0.16 0.16
## entire watching left hero took
## 0.15 0.15 0.15 0.15 0.15
## feelings style fairly characters going
## 0.15 0.15 0.15 0.14 0.14
## couldnt character said clan wont
## 0.14 0.14 0.14 0.14 0.14
## heart male sitting almost turner
## 0.13 0.13 0.13 0.13 0.13
## crazy touched worlds water view
## 0.13 0.13 0.13 0.13 0.13
## appears final lover loves whole
## 0.13 0.13 0.13 0.12 0.12
## went child picture thats tale
## 0.12 0.12 0.12 0.12 0.12
## battle legends refer will resist
## 0.12 0.12 0.11 0.11 0.11
## choose everything family everyday person
## 0.11 0.11 0.11 0.11 0.11
## knew saw note leaving shifter
## 0.11 0.11 0.11 0.11 0.11
## involved deeper yet shannon stacey
## 0.11 0.11 0.11 0.11 0.11
## enthralled revenge cross demons fighting
## 0.11 0.11 0.11 0.11 0.11
## hell important impossible individuals respected
## 0.11 0.11 0.11 0.11 0.11
## stay win wondered agents dane
## 0.11 0.11 0.11 0.11 0.11
## irishman journey lauren rare wonder
## 0.11 0.11 0.11 0.11 0.11
## rest accepted busy cards gold
## 0.11 0.11 0.11 0.11 0.11
## music packed rooted shed tall
## 0.11 0.11 0.11 0.11 0.11
## truth helped needs adored seriesi
## 0.11 0.11 0.11 0.11 0.11
## towards honestly triology wide devlin
## 0.11 0.11 0.11 0.11 0.11
## driving sucker fears particularly excitement
## 0.11 0.11 0.10 0.10 0.10
## scene call constant strength moving
## 0.10 0.10 0.10 0.10 0.10
## physical brave
## 0.10 0.10
analizar_texto(reviews_neg, "Reseñas Negativas (1 Estrella)")
##
##
## ==================================================
## INICIANDO ANÁLISIS PARA: Reseñas Negativas (1 Estrella)
## ==================================================
## Warning in tm_map.SimpleCorpus(., content_transformer(tolower)): transformation
## drops documents
## Warning in tm_map.SimpleCorpus(., removeNumbers): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(., removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(., stripWhitespace): transformation drops
## documents
##
## --- Palabras más frecuentes (ANTES de quitar stopwords) ---
## word freq
## the the 1332
## and and 726
## was was 564
## this this 544
## book book 401
## that that 335
## not not 328
## for for 289
## but but 277
## story story 205
## read read 192
## just just 187
## like like 182
## have have 179
## her her 176
## with with 170
## you you 153
## she she 147
## all all 144
## about about 122
## Warning in tm_map.SimpleCorpus(., removeWords, stopwords("english")):
## transformation drops documents
## Warning in tm_map.SimpleCorpus(., removeWords, c("book", "read", "story", :
## transformation drops documents
##
## --- Palabras más frecuentes (DESPUÉS de quitar stopwords) ---
## word freq
## really really 101
## didnt didnt 94
## good good 90
## characters characters 89
## even even 88
## time time 82
## dont dont 79
## books books 76
## much much 76
## reading reading 73
## short short 71
## first first 71
## love love 60
## will will 57
## can can 57
## way way 54
## never never 53
## sex sex 53
## make make 52
## something something 47
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : enough could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : pages could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : found could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : sorry could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : reviews could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : recommend could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : wanted could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : two could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : started could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : money could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : doesnt could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : long could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : right could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : romance could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : words could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : seemed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : many could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : someone could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : anything could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : almost could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : interesting could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : review could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : maybe could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : woman could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : actually could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : understand could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 5, max.words =
## 100, : high could not be fit on page. It will not be plotted.
##
## --- Asociaciones para las 10 palabras más frecuentes ---
##
## Palabra: really
## $really
## apologies backbone caves counted cow
## 0.62 0.62 0.62 0.62 0.62
## doctorthen drugging geezand handcuff handcuffed
## 0.62 0.62 0.62 0.62 0.62
## handcuffing handcuffs headboard headway hurting
## 0.62 0.62 0.62 0.62 0.62
## involuntary locks loosen lustful notes
## 0.62 0.62 0.62 0.62 0.62
## problemthe protect riding scattered scream
## 0.62 0.62 0.62 0.62 0.62
## shot standing steps sticking swallow
## 0.62 0.62 0.62 0.62 0.62
## swallowing teases thatauthor thesaurusthe toe
## 0.62 0.62 0.62 0.62 0.62
## umhe inconsistencies closet saves minute
## 0.62 0.58 0.55 0.50 0.49
## towards apologize hurt divorce sign
## 0.48 0.48 0.48 0.48 0.48
## safe redeem strength hes taking
## 0.46 0.46 0.46 0.43 0.43
## hadnt drugged please finishing breaking
## 0.43 0.43 0.43 0.43 0.43
## acted asks butt papers seconds
## 0.43 0.43 0.43 0.43 0.43
## supposedly boy house tells bed
## 0.43 0.42 0.42 0.42 0.42
## starts gets keep grew agree
## 0.41 0.39 0.38 0.38 0.38
## editor finally hands lets yeah
## 0.38 0.37 0.36 0.35 0.34
## expert eyes wanted seemed incorrect
## 0.34 0.34 0.33 0.33 0.33
## female care cant present correct
## 0.32 0.32 0.32 0.32 0.32
## now everything happened always better
## 0.31 0.30 0.30 0.30 0.29
## trying youre show needs ready
## 0.29 0.28 0.28 0.28 0.28
## guys seriously knows change hours
## 0.28 0.28 0.28 0.28 0.28
## gives issue ever ahead awhilebook
## 0.28 0.27 0.27 0.27 0.27
## chic crosses groping harass harassing
## 0.27 0.27 0.27 0.27 0.27
## jake leadsmy meso mia nervous
## 0.27 0.27 0.27 0.27 0.27
## quits resist theredidnt uneventful yep
## 0.27 0.27 0.27 0.27 0.27
## many youll going second reason
## 0.26 0.26 0.26 0.26 0.26
## series look dont let call
## 0.26 0.26 0.25 0.25 0.25
## boss saying sick pathetic much
## 0.25 0.25 0.25 0.25 0.24
## lost back character start said
## 0.24 0.24 0.24 0.24 0.24
## words take break sexually think
## 0.24 0.23 0.23 0.23 0.22
## sure finished something figure throughout
## 0.22 0.22 0.22 0.22 0.22
## felt guy authors reading help
## 0.21 0.21 0.21 0.21 0.21
## times using enjoy weak kill
## 0.21 0.21 0.21 0.21 0.21
## see first immediately completely didnt
## 0.20 0.20 0.20 0.20 0.20
## lot stuff makes man role
## 0.20 0.20 0.20 0.20 0.20
## anticipation atticus blogspot com delights
## 0.20 0.20 0.20 0.20 0.20
## destined dot elusive glossed happenedokay
## 0.20 0.20 0.20 0.20 0.20
## haydeereviews initiate instantaneous irritation kelly
## 0.20 0.20 0.20 0.20 0.20
## lissa lovey marc mild morelets
## 0.20 0.20 0.20 0.20 0.20
## outlandish proclaiming redemptionsame rival storyto
## 0.20 0.20 0.20 0.20 0.20
## struggle undying unlike booksim dana
## 0.20 0.20 0.20 0.20 0.20
## edward fantastic linei mummaybe nfh
## 0.20 0.20 0.20 0.20 0.20
## pyte sceneim shopping teaill amounts
## 0.20 0.20 0.20 0.20 0.20
## explanations guidance revised rife tears
## 0.20 0.20 0.20 0.20 0.20
## vast actor agreei bookif cadfael
## 0.20 0.20 0.20 0.20 0.20
## catches choose commentsamazon deceased disliked
## 0.20 0.20 0.20 0.20 0.20
## ellis episodes humor intelligent medieval
## 0.20 0.20 0.20 0.20 0.20
## miscast notthere partly period peters
## 0.20 0.20 0.20 0.20 0.20
## plod production scripted sheriff solved
## 0.20 0.20 0.20 0.20 0.20
## suggesting television might goes chance
## 0.20 0.20 0.19 0.19 0.18
## stop normally seeing missing quit
## 0.18 0.18 0.18 0.18 0.18
## bland women used convinces job
## 0.18 0.18 0.18 0.18 0.18
## promising pace mates promises types
## 0.18 0.18 0.18 0.18 0.18
## gun motivations people bad stupid
## 0.18 0.18 0.17 0.17 0.17
## girl dislike stuck synopsis wrong
## 0.17 0.17 0.17 0.17 0.17
## challenge greatly books isnt next
## 0.17 0.17 0.16 0.16 0.16
## find can started appealing mystery
## 0.15 0.15 0.15 0.15 0.15
## sadly decided instead writing word
## 0.15 0.15 0.15 0.14 0.14
## wont poor making excuse review
## 0.14 0.14 0.14 0.14 0.14
## opinion guess since real stand
## 0.14 0.14 0.14 0.14 0.14
## leave day love make someone
## 0.14 0.14 0.13 0.13 0.13
## yet liked action negative post
## 0.13 0.13 0.13 0.13 0.13
## enjoyment meet working appeal aside
## 0.13 0.13 0.13 0.13 0.13
## leaving professional summary connection ass
## 0.13 0.13 0.13 0.13 0.13
## emotion purchasing shocked explained prime
## 0.13 0.13 0.13 0.13 0.13
## fight passion shut suffered wished
## 0.13 0.13 0.13 0.13 0.13
## perfect shame within posted draft
## 0.13 0.13 0.13 0.13 0.13
## except holes endless mysteries characters
## 0.13 0.13 0.13 0.13 0.12
## couldnt try never nothing several
## 0.12 0.12 0.12 0.12 0.12
## attention give thought thats wasnt
## 0.12 0.12 0.12 0.12 0.12
## disappointed reader case later kind
## 0.12 0.12 0.12 0.12 0.12
## shes buddies dexter donaldsons examplethis
## 0.12 0.12 0.12 0.12 0.12
## folks football friendsin heart jocks
## 0.12 0.12 0.12 0.12 0.12
## obsessed psychopath psychopathic sources steven
## 0.12 0.12 0.12 0.12 0.12
## abused abuser assassin believability connects
## 0.12 0.12 0.12 0.12 0.12
## cultural defend gained guarded hellleer
## 0.12 0.12 0.12 0.12 0.12
## inability madea mynix paces pepper
## 0.12 0.12 0.12 0.12 0.12
## perrys realistic sienna tyler voice
## 0.12 0.12 0.12 0.12 0.12
## wos beast beauty bitterness humanoid
## 0.12 0.12 0.12 0.12 0.12
## indicated retelling attacks iranian liking
## 0.12 0.12 0.12 0.12 0.12
## minority perhaps unfortunately picked experience
## 0.12 0.11 0.11 0.11 0.11
## thing seems doesnt talk ive
## 0.11 0.11 0.11 0.11 0.11
## readers reasons years dark full
## 0.11 0.11 0.11 0.11 0.11
## younger knew short style bored
## 0.11 0.10 0.10 0.10 0.10
## enough paragraph took work pretty
## 0.10 0.10 0.10 0.10 0.10
## consider mean easily lots
## 0.10 0.10 0.10 0.10
##
##
## Palabra: didnt
## $didnt
## care agoi
## 0.45 0.40
## boredom bridge
## 0.40 0.40
## captain couldntfor
## 0.40 0.40
## descriptioni discovered
## 0.40 0.40
## duplication elements
## 0.40 0.40
## fascinated inserted
## 0.40 0.40
## journaling map
## 0.40 0.40
## occasion photos
## 0.40 0.40
## printed printing
## 0.40 0.40
## scrapbook shown
## 0.40 0.40
## spell stood
## 0.40 0.40
## titanic paragraphs
## 0.40 0.38
## talking obvious
## 0.37 0.36
## told apart
## 0.35 0.35
## continuity suddenly
## 0.33 0.33
## bigot characters
## 0.33 0.32
## check often
## 0.32 0.31
## admired aiden
## 0.31 0.31
## aidens appalled
## 0.31 0.31
## appearance caveman
## 0.31 0.31
## certian chestthumping
## 0.31 0.31
## comical completing
## 0.31 0.31
## complexity conclusionon
## 0.31 0.31
## conniving crafty
## 0.31 0.31
## creek daisy
## 0.31 0.31
## daisys disservice
## 0.31 0.31
## experienced fashion
## 0.31 0.31
## fluff hick
## 0.31 0.31
## hollow ignorant
## 0.31 0.31
## ignorantly image
## 0.31 0.31
## jessiemae keepthewomanbarefootandpregnant
## 0.31 0.31
## koreans kywhich
## 0.31 0.31
## lunk maniacally
## 0.31 0.31
## met moneygrubbing
## 0.31 0.31
## mustache outrageously
## 0.31 0.31
## peter railroad
## 0.31 0.31
## revolting side
## 0.31 0.31
## softer stereoptyped
## 0.31 0.31
## storyanyway trio
## 0.31 0.31
## twodimensional unendearing
## 0.31 0.31
## winced going
## 0.31 0.30
## theyre actually
## 0.30 0.30
## day character
## 0.30 0.29
## novel female
## 0.28 0.27
## feel introduced
## 0.27 0.27
## page caught
## 0.27 0.27
## ones particular
## 0.27 0.27
## product room
## 0.27 0.27
## intelligence breaking
## 0.27 0.27
## finished extremely
## 0.26 0.26
## outside remember
## 0.26 0.26
## predictable business
## 0.26 0.26
## needed men
## 0.25 0.25
## create finally
## 0.25 0.24
## boss parts
## 0.24 0.24
## couldnt better
## 0.23 0.23
## immediately ahead
## 0.23 0.23
## awhilebook chic
## 0.23 0.23
## crosses groping
## 0.23 0.23
## harass harassing
## 0.23 0.23
## jake leadsmy
## 0.23 0.23
## meso mia
## 0.23 0.23
## nervous quits
## 0.23 0.23
## resist theredidnt
## 0.23 0.23
## uneventful yep
## 0.23 0.23
## allwas alsoi
## 0.23 0.23
## ashworthno catherine
## 0.23 0.23
## chemistry idiots
## 0.23 0.23
## initially lord
## 0.23 0.23
## pimp quickie
## 0.23 0.23
## shack first
## 0.23 0.22
## might cant
## 0.22 0.22
## quit choice
## 0.22 0.22
## editor note
## 0.22 0.22
## reread youll
## 0.21 0.21
## wanted laughing
## 0.21 0.21
## almost second
## 0.21 0.21
## plan cunning
## 0.21 0.21
## happened stuck
## 0.21 0.21
## happily question
## 0.21 0.21
## learned revealed
## 0.21 0.21
## suspect referring
## 0.21 0.21
## moments running
## 0.21 0.21
## apparent returned
## 0.21 0.21
## secret showing
## 0.21 0.21
## tied track
## 0.21 0.21
## really sense
## 0.20 0.20
## thing action
## 0.20 0.20
## lady background
## 0.20 0.20
## knew even
## 0.19 0.19
## weak bit
## 0.19 0.19
## always months
## 0.19 0.18
## reading thats
## 0.18 0.18
## flow dialogue
## 0.18 0.18
## lacking family
## 0.18 0.17
## ive felt
## 0.17 0.16
## found sounded
## 0.16 0.16
## big drama
## 0.16 0.16
## return annoying
## 0.16 0.16
## dropped saves
## 0.16 0.16
## main twist
## 0.16 0.16
## game theres
## 0.16 0.16
## asked incomplete
## 0.16 0.16
## developed guy
## 0.15 0.15
## something secondary
## 0.15 0.15
## contractions bland
## 0.15 0.15
## aside sexually
## 0.15 0.15
## tell convinces
## 0.15 0.15
## promising freaking
## 0.15 0.15
## meaningless publisher
## 0.15 0.15
## lisa dashes
## 0.15 0.15
## redundant relying
## 0.15 0.15
## sped whodunit
## 0.15 0.15
## capters freshman
## 0.15 0.15
## journalismi anticipation
## 0.15 0.15
## atticus blogspot
## 0.15 0.15
## com delights
## 0.15 0.15
## destined dot
## 0.15 0.15
## elusive glossed
## 0.15 0.15
## happenedokay haydeereviews
## 0.15 0.15
## initiate instantaneous
## 0.15 0.15
## irritation kelly
## 0.15 0.15
## lissa lovey
## 0.15 0.15
## marc mild
## 0.15 0.15
## morelets outlandish
## 0.15 0.15
## proclaiming promises
## 0.15 0.15
## redemptionsame rival
## 0.15 0.15
## storyto struggle
## 0.15 0.15
## undying unlike
## 0.15 0.15
## amory apologize
## 0.15 0.15
## conversation desired
## 0.15 0.15
## grandmother hurt
## 0.15 0.15
## improve indian
## 0.15 0.15
## indoors intimated
## 0.15 0.15
## kasie leaves
## 0.15 0.15
## neither nonexistent
## 0.15 0.15
## overheard problem
## 0.15 0.15
## programmer prologue
## 0.15 0.15
## scathing smoking
## 0.15 0.15
## terribly tomboy
## 0.15 0.15
## violated virtue
## 0.15 0.15
## womans hates
## 0.15 0.15
## divorce close
## 0.15 0.15
## attempted devlope
## 0.15 0.15
## fault porno
## 0.15 0.15
## damon deserve
## 0.15 0.15
## soooo storyit
## 0.15 0.15
## dense emotionless
## 0.15 0.15
## score hurrynever
## 0.15 0.15
## interestingtoo sooo
## 0.15 0.15
## whiny charactersjacob
## 0.15 0.15
## cheats contracted
## 0.15 0.15
## decides deliberately
## 0.15 0.15
## efforts gonorrhea
## 0.15 0.15
## graduating jacob
## 0.15 0.15
## pregnantjacob ray
## 0.15 0.15
## rays sabotage
## 0.15 0.15
## bigger hop
## 0.15 0.15
## near somethingall
## 0.15 0.15
## train waiting
## 0.15 0.15
## chance given
## 0.14 0.14
## see husband
## 0.14 0.14
## take clue
## 0.14 0.14
## attention little
## 0.14 0.14
## girl gets
## 0.14 0.14
## makes tried
## 0.14 0.14
## young mean
## 0.14 0.14
## term names
## 0.14 0.14
## example hour
## 0.14 0.14
## typos middle
## 0.14 0.14
## longer try
## 0.14 0.13
## make two
## 0.13 0.13
## another job
## 0.13 0.13
## things fact
## 0.13 0.13
## smart place
## 0.13 0.13
## thrown mistake
## 0.13 0.13
## sure let
## 0.12 0.12
## never long
## 0.12 0.12
## find know
## 0.12 0.12
## issue right
## 0.12 0.12
## series consider
## 0.12 0.12
## sound uses
## 0.12 0.12
## ever head
## 0.12 0.12
## shes grab
## 0.12 0.12
## challenge next
## 0.12 0.11
## back name
## 0.11 0.11
## keep put
## 0.11 0.11
## anything wasnt
## 0.11 0.11
## school development
## 0.11 0.11
## halfway dislike
## 0.11 0.11
## later develop
## 0.11 0.11
## giving lets
## 0.11 0.11
## come engaged
## 0.11 0.11
## nearly jerk
## 0.11 0.11
## appropriate redeem
## 0.11 0.11
## connections rarely
## 0.11 0.11
## much rushed
## 0.10 0.10
## think lead
## 0.10 0.10
## starts normally
## 0.10 0.10
## either kept
## 0.10 0.10
## supposed dramatic
## 0.10 0.10
## guess purchased
## 0.10 0.10
## synopsis cared
## 0.10 0.10
## realize novels
## 0.10 0.10
## happy twice
## 0.10 0.10
##
##
## Palabra: good
## $good
## advance proof sme stupidityauthors
## 0.28 0.28 0.28 0.28
## stupidly techniqueit career learned
## 0.28 0.28 0.26 0.26
## means thing isnt blurb
## 0.26 0.25 0.21 0.20
## woman act writer errors
## 0.19 0.19 0.19 0.18
## confident usage backstage bland
## 0.18 0.18 0.18 0.18
## bothering continuations hmmm infancy
## 0.18 0.18 0.18 0.18
## investment mature olivia reactions
## 0.18 0.18 0.18 0.18
## recall respond sensationally storytelling
## 0.18 0.18 0.18 0.18
## amy apostrophes arethe blankenshipthe
## 0.18 0.18 0.18 0.18
## blood bomb booklol bound
## 0.18 0.18 0.18 0.18
## brotherhood childhood confuse dagger
## 0.18 0.18 0.18 0.18
## damagedby disasterby evansbeautifully exes
## 0.18 0.18 0.18 0.18
## fiore form frostbeautiful huntress
## 0.18 0.18 0.18 0.18
## hystericalso jamie jealous jeaniene
## 0.18 0.18 0.18 0.18
## katie labeled languagewhere listened
## 0.18 0.18 0.18 0.18
## loosely mcguirerealby meanthis meokay
## 0.18 0.18 0.18 0.18
## nevernever obstacles occurrences overly
## 0.18 0.18 0.18 0.18
## possessive ruining saidi sentences
## 0.18 0.18 0.18 0.18
## separated seriesby seriouslynothing shape
## 0.18 0.18 0.18 0.18
## state stated successful suffering
## 0.18 0.18 0.18 0.18
## sweethearts wardthe yasome kind
## 0.18 0.18 0.18 0.18
## protagonists cash strikes example
## 0.18 0.18 0.18 0.18
## ones tension prime surely
## 0.18 0.18 0.18 0.18
## buddies dexter donaldsons examplethis
## 0.18 0.18 0.18 0.18
## folks football friendsin heart
## 0.18 0.18 0.18 0.18
## jocks obsessed psychopath psychopathic
## 0.18 0.18 0.18 0.18
## sources steven actand bedwhat
## 0.18 0.18 0.18 0.18
## believed brothers granted hitting
## 0.18 0.18 0.18 0.18
## irritated luke proposal warmth
## 0.18 0.18 0.18 0.18
## washy wishy womenimplied bothered
## 0.18 0.18 0.18 0.18
## endi realized truth awfulthe
## 0.18 0.18 0.18 0.18
## barmaid descibed erotically heaspoliermy
## 0.18 0.18 0.18 0.18
## herewhich herione improves rapes
## 0.18 0.18 0.18 0.18
## risked seduction sold whore
## 0.18 0.18 0.18 0.18
## witnessed alternative askedah category
## 0.18 0.18 0.18 0.18
## clothes emthis fix ideas
## 0.18 0.18 0.18 0.18
## latter max minewhat nada
## 0.18 0.18 0.18 0.18
## pedestrian proofreader ruin ruined
## 0.18 0.18 0.18 0.18
## stewart suck unnatural workout
## 0.18 0.18 0.18 0.18
## complain flick sexiness streamed
## 0.18 0.18 0.18 0.18
## way lead however reviews
## 0.17 0.17 0.17 0.17
## heroine term real wouldnt
## 0.17 0.17 0.17 0.17
## typos guy editing nothing
## 0.17 0.16 0.16 0.16
## spelling times reasons job
## 0.16 0.16 0.16 0.16
## somehow genre given wasnt
## 0.16 0.16 0.15 0.15
## incorrect lowest top none
## 0.15 0.15 0.15 0.15
## paragraphs raped sleeps american
## 0.15 0.15 0.15 0.14
## sense help drags porn
## 0.14 0.14 0.14 0.14
## getting dislike fine hero
## 0.14 0.14 0.14 0.14
## leading particularly stuck called
## 0.14 0.14 0.14 0.14
## jerk cares suspense jumping
## 0.14 0.14 0.14 0.14
## expanded horror time may
## 0.14 0.14 0.13 0.13
## grammatical kept bad girl
## 0.13 0.13 0.13 0.13
## thinking cant gets women
## 0.13 0.13 0.13 0.13
## crazy dramatic reviewer break
## 0.13 0.13 0.13 0.13
## weak talking mind detail
## 0.13 0.13 0.13 0.12
## horrible sure high sentence
## 0.12 0.12 0.12 0.12
## ive erotica parts mention
## 0.12 0.12 0.12 0.12
## label authors someone biggest
## 0.11 0.11 0.11 0.11
## forced native scared take
## 0.11 0.11 0.11 0.11
## even interest call took
## 0.11 0.11 0.11 0.11
## familiar secondary less uses
## 0.11 0.11 0.11 0.11
## cunning reads twilight literary
## 0.11 0.11 0.11 0.11
## boys cents difficulty favorite
## 0.11 0.11 0.11 0.11
## later life mean meet
## 0.11 0.11 0.11 0.11
## mistakes rated separate words
## 0.11 0.11 0.11 0.11
## wtf convinces day century
## 0.11 0.11 0.11 0.11
## continued warm correct scene
## 0.11 0.11 0.11 0.11
## fetched hopes smart lust
## 0.11 0.11 0.11 0.11
## developing wrong bam emotions
## 0.11 0.11 0.11 0.11
## issues apart continuity suddenly
## 0.11 0.11 0.11 0.11
## theres likable girlfriend gang
## 0.11 0.11 0.11 0.11
## bet despite known provides
## 0.11 0.11 0.11 0.11
## note promises event problem
## 0.11 0.11 0.11 0.11
## inside elses hates convoluted
## 0.11 0.11 0.11 0.11
## makings stomach well
## 0.11 0.11 0.10
##
##
## Palabra: characters
## $characters
## novel bigot
## 0.53 0.53
## admired aiden
## 0.50 0.50
## aidens appalled
## 0.50 0.50
## appearance caveman
## 0.50 0.50
## certian chestthumping
## 0.50 0.50
## comical completing
## 0.50 0.50
## complexity conclusionon
## 0.50 0.50
## conniving crafty
## 0.50 0.50
## creek daisy
## 0.50 0.50
## daisys disservice
## 0.50 0.50
## experienced fashion
## 0.50 0.50
## fluff hick
## 0.50 0.50
## hollow ignorant
## 0.50 0.50
## ignorantly image
## 0.50 0.50
## jessiemae keepthewomanbarefootandpregnant
## 0.50 0.50
## koreans kywhich
## 0.50 0.50
## lunk maniacally
## 0.50 0.50
## met moneygrubbing
## 0.50 0.50
## mustache outrageously
## 0.50 0.50
## peter railroad
## 0.50 0.50
## revolting side
## 0.50 0.50
## softer stereoptyped
## 0.50 0.50
## storyanyway trio
## 0.50 0.50
## twodimensional unendearing
## 0.50 0.50
## winced immediately
## 0.50 0.48
## happily revealed
## 0.46 0.46
## suspect choice
## 0.46 0.42
## predictable business
## 0.42 0.42
## showing almost
## 0.42 0.41
## bit finally
## 0.41 0.40
## cunning referring
## 0.40 0.40
## intelligence breaking
## 0.40 0.40
## second developed
## 0.39 0.38
## outside main
## 0.37 0.37
## game background
## 0.37 0.36
## actually sounded
## 0.35 0.34
## laughing character
## 0.34 0.34
## moments apparent
## 0.34 0.34
## note returned
## 0.34 0.34
## track care
## 0.34 0.33
## reread didnt
## 0.32 0.32
## drama plan
## 0.32 0.32
## head incomplete
## 0.32 0.32
## explain talking
## 0.31 0.31
## longer kept
## 0.31 0.30
## makes father
## 0.30 0.30
## human found
## 0.29 0.28
## make hardly
## 0.28 0.28
## tension means
## 0.28 0.28
## enough extremely
## 0.27 0.27
## sound obvious
## 0.27 0.27
## twist learned
## 0.27 0.27
## smart secret
## 0.27 0.27
## supposed ever
## 0.26 0.26
## men point
## 0.26 0.25
## shall uncle
## 0.25 0.25
## might became
## 0.24 0.24
## least come
## 0.24 0.24
## half baby
## 0.24 0.24
## dohner enforcer
## 0.24 0.24
## equally grady
## 0.24 0.24
## heat herselfi
## 0.24 0.24
## listen mate
## 0.24 0.24
## mating mika
## 0.24 0.24
## minnie omar
## 0.24 0.24
## omars pretend
## 0.24 0.24
## purrfect regard
## 0.24 0.24
## safety wellbeing
## 0.24 0.24
## weres whines
## 0.24 0.24
## amory conversation
## 0.24 0.24
## desired grandmother
## 0.24 0.24
## improve indian
## 0.24 0.24
## indoors intimated
## 0.24 0.24
## kasie leaves
## 0.24 0.24
## neither nonexistent
## 0.24 0.24
## overheard programmer
## 0.24 0.24
## prologue scathing
## 0.24 0.24
## smoking terribly
## 0.24 0.24
## tomboy violated
## 0.24 0.24
## virtue womans
## 0.24 0.24
## chance rushed
## 0.23 0.23
## never clue
## 0.23 0.23
## appealing able
## 0.23 0.22
## secondary contractions
## 0.22 0.22
## year develop
## 0.22 0.22
## loves tell
## 0.22 0.22
## continued introduced
## 0.22 0.22
## moving thrown
## 0.22 0.22
## adopted aunt
## 0.22 0.22
## visits weeks
## 0.22 0.22
## willing apologize
## 0.22 0.22
## hurt married
## 0.22 0.22
## felt wont
## 0.21 0.21
## even find
## 0.21 0.21
## reading either
## 0.21 0.21
## action young
## 0.21 0.21
## years things
## 0.21 0.21
## hey happy
## 0.21 0.21
## time finished
## 0.20 0.20
## thats wasnt
## 0.20 0.20
## place world
## 0.20 0.19
## big sense
## 0.19 0.19
## little actual
## 0.19 0.19
## order lacking
## 0.19 0.19
## constantly think
## 0.19 0.18
## style first
## 0.18 0.18
## something female
## 0.18 0.18
## know right
## 0.18 0.18
## feel needed
## 0.18 0.18
## theyre dramatic
## 0.18 0.18
## term often
## 0.18 0.18
## shes tied
## 0.18 0.18
## certain however
## 0.17 0.17
## anything trying
## 0.17 0.17
## earth annoying
## 0.17 0.17
## mean sounds
## 0.17 0.17
## giving stuck
## 0.17 0.17
## engaged paragraphs
## 0.17 0.17
## cares forward
## 0.17 0.17
## move connections
## 0.17 0.17
## native took
## 0.16 0.16
## onedimensional confused
## 0.16 0.16
## friend guess
## 0.16 0.16
## centred previously
## 0.16 0.16
## selfabsorbed somewhat
## 0.16 0.16
## downloaded century
## 0.16 0.16
## adds begin
## 0.16 0.16
## child glove
## 0.16 0.16
## sadly warm
## 0.16 0.16
## provide unlikable
## 0.16 0.16
## meaning nick
## 0.16 0.16
## towards hoped
## 0.16 0.16
## particular suddenly
## 0.16 0.16
## death gang
## 0.16 0.16
## rescued responsible
## 0.16 0.16
## shallow shannon
## 0.16 0.16
## references problem
## 0.16 0.16
## today twain
## 0.16 0.16
## given writing
## 0.15 0.15
## description better
## 0.15 0.15
## let wanted
## 0.15 0.15
## another james
## 0.15 0.15
## lacked relationship
## 0.15 0.15
## idea agnes
## 0.15 0.15
## amnesia cannon
## 0.15 0.15
## caused cheerleader
## 0.15 0.15
## claimed closest
## 0.15 0.15
## conflict conform
## 0.15 0.15
## conscious creating
## 0.15 0.15
## demons fatecannon
## 0.15 0.15
## favoured flaws
## 0.15 0.15
## harper harpers
## 0.15 0.15
## hierarchy highlights
## 0.15 0.15
## incapable incessantly
## 0.15 0.15
## mysterious oblivious
## 0.15 0.15
## overeven peaking
## 0.15 0.15
## personally prevail
## 0.15 0.15
## primary quintessential
## 0.15 0.15
## refused regular
## 0.15 0.15
## roles secrets
## 0.15 0.15
## shortlived society
## 0.15 0.15
## solely sophomore
## 0.15 0.15
## spite staying
## 0.15 0.15
## succeeded suit
## 0.15 0.15
## supporting surroundings
## 0.15 0.15
## definition lotlike
## 0.15 0.15
## nail plunge
## 0.15 0.15
## wasconfused accepting
## 0.15 0.15
## affection againseriously
## 0.15 0.15
## alas alluding
## 0.15 0.15
## analogy apology
## 0.15 0.15
## aremy attached
## 0.15 0.15
## awkwardly backs
## 0.15 0.15
## beard beards
## 0.15 0.15
## bears bedding
## 0.15 0.15
## benefits bent
## 0.15 0.15
## blindly blunt
## 0.15 0.15
## bodies breath
## 0.15 0.15
## brulee candy
## 0.15 0.15
## candyslick center
## 0.15 0.15
## childs chocolate
## 0.15 0.15
## cinnamon cloth
## 0.15 0.15
## cloud cream
## 0.15 0.15
## cregraveme crumbs
## 0.15 0.15
## dehumanizing dickens
## 0.15 0.15
## disgraced distraction
## 0.15 0.15
## doessedgwick eating
## 0.15 0.15
## ensign excuses
## 0.15 0.15
## faster fistthe
## 0.15 0.15
## fistwhat flight
## 0.15 0.15
## forge forged
## 0.15 0.15
## frames glinting
## 0.15 0.15
## golden grabbing
## 0.15 0.15
## grossed hallefrickinglujah
## 0.15 0.15
## hammer harsher
## 0.15 0.15
## hearing hearted
## 0.15 0.15
## het hood
## 0.15 0.15
## hovering hunter
## 0.15 0.15
## imagining included
## 0.15 0.15
## isit itthere
## 0.15 0.15
## lance landing
## 0.15 0.15
## lift losing
## 0.15 0.15
## lovedlets mein
## 0.15 0.15
## melike merriamwebster
## 0.15 0.15
## metal miracle
## 0.15 0.15
## natural pennon
## 0.15 0.15
## pennons perspiration
## 0.15 0.15
## pillows plight
## 0.15 0.15
## ponies pounding
## 0.15 0.15
## pump repeatingand
## 0.15 0.15
## retail rudeness
## 0.15 0.15
## sappiest sappy
## 0.15 0.15
## security sedgwick
## 0.15 0.15
## sheened shining
## 0.15 0.15
## sincere slick
## 0.15 0.15
## slight sorrythe
## 0.15 0.15
## souffleacute stalker
## 0.15 0.15
## stardustreally sticky
## 0.15 0.15
## storyi streamer
## 0.15 0.15
## stress striking
## 0.15 0.15
## stroking suede
## 0.15 0.15
## surged swallowtailed
## 0.15 0.15
## sword sympathize
## 0.15 0.15
## tasted tentatively
## 0.15 0.15
## thingfor throughand
## 0.15 0.15
## toned transfixed
## 0.15 0.15
## triangular typically
## 0.15 0.15
## updates wei
## 0.15 0.15
## welike welome
## 0.15 0.15
## wet whipped
## 0.15 0.15
## wings actions
## 0.15 0.15
## active anyway
## 0.15 0.15
## bantering dunnit
## 0.15 0.15
## exwife guessing
## 0.15 0.15
## handful possiblei
## 0.15 0.15
## raine relevant
## 0.15 0.15
## scarce sufficient
## 0.15 0.15
## suspects thick
## 0.15 0.15
## told andrea
## 0.15 0.15
## dislikable dispicable
## 0.15 0.15
## fallen received
## 0.15 0.15
## relatives agoi
## 0.15 0.15
## boredom bridge
## 0.15 0.15
## captain couldntfor
## 0.15 0.15
## descriptioni discovered
## 0.15 0.15
## duplication elements
## 0.15 0.15
## fascinated inserted
## 0.15 0.15
## journaling map
## 0.15 0.15
## occasion photos
## 0.15 0.15
## printed printing
## 0.15 0.15
## scrapbook shown
## 0.15 0.15
## spell stood
## 0.15 0.15
## titanic advance
## 0.15 0.15
## proof sme
## 0.15 0.15
## stupidityauthors stupidly
## 0.15 0.15
## techniqueit directed
## 0.15 0.15
## introducing linked
## 0.15 0.15
## sagasince vague
## 0.15 0.15
## bothered endi
## 0.15 0.15
## realized beast
## 0.15 0.15
## beauty bitterness
## 0.15 0.15
## humanoid indicated
## 0.15 0.15
## retelling way
## 0.15 0.14
## long put
## 0.14 0.14
## people work
## 0.14 0.14
## angel jackson
## 0.14 0.14
## lets page
## 0.14 0.14
## ends couldnt
## 0.13 0.13
## usually intriguing
## 0.13 0.13
## added yet
## 0.13 0.13
## perhaps act
## 0.13 0.13
## seemed sex
## 0.13 0.13
## spelling stilted
## 0.13 0.13
## uses start
## 0.13 0.13
## meet top
## 0.13 0.13
## shocking frankly
## 0.13 0.13
## must behavior
## 0.13 0.13
## sort hoping
## 0.13 0.13
## apart ago
## 0.13 0.13
## gives event
## 0.13 0.13
## else rather
## 0.12 0.12
## american complete
## 0.12 0.12
## name going
## 0.12 0.12
## say believe
## 0.12 0.12
## check really
## 0.12 0.12
## plot thing
## 0.12 0.12
## times part
## 0.12 0.12
## scenes less
## 0.12 0.12
## house turns
## 0.12 0.12
## white ive
## 0.12 0.12
## says beautiful
## 0.12 0.12
## pushed situation
## 0.12 0.12
## real grew
## 0.12 0.12
## safe significant
## 0.12 0.12
## simple summary
## 0.12 0.12
## works itthe
## 0.12 0.12
## psycho remember
## 0.12 0.12
## knowing running
## 0.12 0.12
## acts advice
## 0.12 0.12
## comes tries
## 0.12 0.12
## virtually suspense
## 0.12 0.12
## asked believable
## 0.12 0.12
## marry interest
## 0.12 0.11
## two frustrating
## 0.11 0.11
## flow reader
## 0.11 0.11
## especially managed
## 0.11 0.11
## adult women
## 0.11 0.11
## dialogue lack
## 0.11 0.11
## enjoy fair
## 0.11 0.11
## still used
## 0.11 0.11
## ended editor
## 0.11 0.11
## hour age
## 0.11 0.11
## partner bed
## 0.11 0.11
## happen novels
## 0.11 0.11
## several old
## 0.10 0.10
## quite
## 0.10
##
##
## Palabra: even
## $even
## nick move adult things
## 0.37 0.35 0.34 0.34
## name adds glove warm
## 0.32 0.31 0.31 0.31
## suddenly adopted aunt visits
## 0.31 0.31 0.31 0.31
## weeks kidnapping parents responses
## 0.31 0.31 0.31 0.31
## ship heroine shes significant
## 0.31 0.29 0.29 0.29
## trust top new lady
## 0.29 0.28 0.27 0.27
## friend paragraphs feeling abduction
## 0.27 0.27 0.26 0.26
## accidents afterthought bedroom cohesiveness
## 0.26 0.26 0.26 0.26
## doubt heroheroine mysterythriller standoffish
## 0.26 0.26 0.26 0.26
## guys men allwas alsoi
## 0.26 0.26 0.26 0.26
## ashworthno catherine chemistry idiots
## 0.26 0.26 0.26 0.26
## initially lord pimp quickie
## 0.26 0.26 0.26 0.26
## shack andrea dislikable dispicable
## 0.26 0.26 0.26 0.26
## fallen received relatives adversary
## 0.26 0.26 0.26 0.26
## allegances allto appearenceslyra assailants
## 0.26 0.26 0.26 0.26
## auntadoptive backstory beau becomes
## 0.26 0.26 0.26 0.26
## bizarre brain brandnicks brunetteblonde
## 0.26 0.26 0.26 0.26
## causes cell checking chula
## 0.26 0.26 0.26 0.26
## ciana classically clearly clunky
## 0.26 0.26 0.26 0.26
## cracked cult darkhairedblonde degree
## 0.26 0.26 0.26 0.26
## diary discovery doctor driven
## 0.26 0.26 0.26 0.26
## encourages engagement examination exposition
## 0.26 0.26 0.26 0.26
## farm fingerviolated formatting graduate
## 0.26 0.26 0.26 0.26
## guides handsome helpfully hide
## 0.26 0.26 0.26 0.26
## hiding hospital hunger important
## 0.26 0.26 0.26 0.26
## inherits intact killing killrape
## 0.26 0.26 0.26 0.26
## lazy lexi lube lustmeanwhile
## 0.26 0.26 0.26 0.26
## lyra lyras magician morebottom
## 0.26 0.26 0.26 0.26
## motivation multiple nightspot onboard
## 0.26 0.26 0.26 0.26
## overreliance parapsychology presumed previous
## 0.26 0.26 0.26 0.26
## proofed readingan reasonable referred
## 0.26 0.26 0.26 0.26
## santera seville spirit stepmother
## 0.26 0.26 0.26 0.26
## stethoscope stone stones subsequent
## 0.26 0.26 0.26 0.26
## survivethe swore target theyd
## 0.26 0.26 0.26 0.26
## thrilled tone university unwanted
## 0.26 0.26 0.26 0.26
## urge viceral virginal virginity
## 0.26 0.26 0.26 0.26
## vkarandall weight woods worselyra
## 0.26 0.26 0.26 0.26
## wretched actand bedwhat believed
## 0.26 0.26 0.26 0.26
## brothers granted hitting irritated
## 0.26 0.26 0.26 0.26
## luke proposal warmth washy
## 0.26 0.26 0.26 0.26
## wishy womenimplied make months
## 0.26 0.26 0.25 0.25
## kept hero tell terrible
## 0.25 0.25 0.25 0.24
## sense onedimensional storytelling actually
## 0.24 0.24 0.24 0.24
## develop local hang introduced
## 0.24 0.24 0.24 0.24
## played somehow page emotion
## 0.24 0.24 0.24 0.24
## ratings towards room girlfriend
## 0.24 0.24 0.24 0.24
## explained places time dont
## 0.24 0.24 0.23 0.23
## woman long pages say
## 0.23 0.23 0.23 0.23
## issue bad young behavior
## 0.23 0.23 0.23 0.23
## evil sleeps liked second
## 0.23 0.23 0.22 0.22
## consider without old lets
## 0.22 0.22 0.22 0.22
## used fact honestly characters
## 0.22 0.22 0.22 0.21
## thought anything sex seems
## 0.21 0.21 0.21 0.21
## least must sort agree
## 0.21 0.21 0.21 0.21
## cared create dohners raped
## 0.21 0.21 0.21 0.21
## better may girl gets
## 0.20 0.20 0.20 0.20
## pass getting job based
## 0.20 0.20 0.20 0.20
## usually never storyline didnt
## 0.19 0.19 0.19 0.19
## trying makes couple still
## 0.19 0.19 0.19 0.19
## break kind half truly
## 0.19 0.19 0.19 0.19
## wouldnt minute books paper
## 0.19 0.19 0.18 0.18
## put thats help outside
## 0.18 0.18 0.18 0.18
## plus house actual ive
## 0.18 0.18 0.18 0.18
## negative obvious leading words
## 0.18 0.18 0.18 0.18
## virgin beautiful ground human
## 0.18 0.18 0.18 0.18
## moving safe lust noticed
## 0.18 0.18 0.18 0.18
## running treated comes tries
## 0.18 0.18 0.18 0.18
## stands species strength rather
## 0.18 0.18 0.18 0.17
## going made attention find
## 0.17 0.17 0.17 0.17
## can murder familiar needed
## 0.17 0.17 0.17 0.17
## secondary serious died avoid
## 0.17 0.17 0.17 0.17
## fooled cant hed random
## 0.17 0.17 0.17 0.17
## regretted dragged favorite angel
## 0.17 0.17 0.17 0.17
## winded repeated appealing previously
## 0.17 0.17 0.17 0.17
## real head loves mess
## 0.17 0.17 0.17 0.17
## count ended accepting affection
## 0.17 0.17 0.17 0.17
## againseriously alas alluding analogy
## 0.17 0.17 0.17 0.17
## apology aremy attached awkwardly
## 0.17 0.17 0.17 0.17
## backs beard beards bears
## 0.17 0.17 0.17 0.17
## beat bedding benefits bent
## 0.17 0.17 0.17 0.17
## blindly blunt bodies body
## 0.17 0.17 0.17 0.17
## breath brulee candy candyslick
## 0.17 0.17 0.17 0.17
## center childs chocolate cinnamon
## 0.17 0.17 0.17 0.17
## cloth cloud continued cream
## 0.17 0.17 0.17 0.17
## cregraveme crumbs dehumanizing dickens
## 0.17 0.17 0.17 0.17
## disgraced distraction doessedgwick early
## 0.17 0.17 0.17 0.17
## eating ensign excuses faster
## 0.17 0.17 0.17 0.17
## fistthe fistwhat flight forge
## 0.17 0.17 0.17 0.17
## forged frames glinting golden
## 0.17 0.17 0.17 0.17
## grabbing grossed hallefrickinglujah hammer
## 0.17 0.17 0.17 0.17
## harsher hearing hearted het
## 0.17 0.17 0.17 0.17
## hood hovering hunter imagining
## 0.17 0.17 0.17 0.17
## impression included isit itthere
## 0.17 0.17 0.17 0.17
## lance landing lift losing
## 0.17 0.17 0.17 0.17
## lovedlets mein melike merriamwebster
## 0.17 0.17 0.17 0.17
## metal miracle natural pace
## 0.17 0.17 0.17 0.17
## pennon pennons perspiration pillows
## 0.17 0.17 0.17 0.17
## plight ponies pounding pump
## 0.17 0.17 0.17 0.17
## repeatingand retail rudeness sappiest
## 0.17 0.17 0.17 0.17
## sappy security sedgwick sheened
## 0.17 0.17 0.17 0.17
## shining sincere slick slight
## 0.17 0.17 0.17 0.17
## sorrythe souffleacute stalker stardustreally
## 0.17 0.17 0.17 0.17
## sticky storyi streamer stress
## 0.17 0.17 0.17 0.17
## striking stroking suede surged
## 0.17 0.17 0.17 0.17
## swallowtailed sword sympathize tasted
## 0.17 0.17 0.17 0.17
## tentatively thingfor throughand toned
## 0.17 0.17 0.17 0.17
## transfixed triangular typically updates
## 0.17 0.17 0.17 0.17
## wei welike welome wet
## 0.17 0.17 0.17 0.17
## whipped wings freaking meaningless
## 0.17 0.17 0.17 0.17
## publisher question disjointed meaning
## 0.17 0.17 0.17 0.17
## talking developing instant bam
## 0.17 0.17 0.17 0.17
## smell hardly letdown repeat
## 0.17 0.17 0.17 0.17
## wow agoi boredom bridge
## 0.17 0.17 0.17 0.17
## captain couldntfor descriptioni discovered
## 0.17 0.17 0.17 0.17
## duplication elements fascinated hour
## 0.17 0.17 0.17 0.17
## inserted journaling map occasion
## 0.17 0.17 0.17 0.17
## ones photos printed printing
## 0.17 0.17 0.17 0.17
## scrapbook shown spell stood
## 0.17 0.17 0.17 0.17
## titanic agonizing baby constantly
## 0.17 0.17 0.17 0.17
## dohner enforcer equally gang
## 0.17 0.17 0.17 0.17
## grady heat herselfi listen
## 0.17 0.17 0.17 0.17
## mate mating mika minnie
## 0.17 0.17 0.17 0.17
## omar omars pretend purrfect
## 0.17 0.17 0.17 0.17
## regard safety wellbeing weres
## 0.17 0.17 0.17 0.17
## whines barely bet despite
## 0.17 0.17 0.17 0.17
## duke fit importance intelligence
## 0.17 0.17 0.17 0.17
## known masters michael prime
## 0.17 0.17 0.17 0.17
## provides provoke zero promises
## 0.17 0.17 0.17 0.17
## elses hates accept afterwards
## 0.17 0.17 0.17 0.17
## alpha argernon belt berrr
## 0.17 0.17 0.17 0.17
## borderline brings casey caseys
## 0.17 0.17 0.17 0.17
## chastity collis cool couldve
## 0.17 0.17 0.17 0.17
## counterparts culture cyborgs dated
## 0.17 0.17 0.17 0.17
## deed dynamic gamechanger holding
## 0.17 0.17 0.17 0.17
## kidnap learns meill necessarily
## 0.17 0.17 0.17 0.17
## orgasm pain parades pointyeared
## 0.17 0.17 0.17 0.17
## rals rape repeatedly replace
## 0.17 0.17 0.17 0.17
## rever silent somebody sweet
## 0.17 0.17 0.17 0.17
## ties unbounded warriorsi wear
## 0.17 0.17 0.17 0.17
## whatever wouldve yeai zorn
## 0.17 0.17 0.17 0.17
## asks bunch calling club
## 0.17 0.17 0.17 0.17
## doran evander fondling hunting
## 0.17 0.17 0.17 0.17
## loses narda seven touching
## 0.17 0.17 0.17 0.17
## van everybody aaaaaannnnd account
## 0.17 0.17 0.17 0.17
## adviceyup affects airplanes alexander
## 0.17 0.17 0.17 0.17
## allwise andre andspouts anybody
## 0.17 0.17 0.17 0.17
## bear birthday boat bookwhat
## 0.17 0.17 0.17 0.17
## coolly cooper decorated dohuhmaybe
## 0.17 0.17 0.17 0.17
## dreams experiencing fly gaps
## 0.17 0.17 0.17 0.17
## generalizations lloyd meanspirited minutiae
## 0.17 0.17 0.17 0.17
## mira miras missingi mix
## 0.17 0.17 0.17 0.17
## mood norton participates party
## 0.17 0.17 0.17 0.17
## permission poem ponderous prospective
## 0.17 0.17 0.17 0.17
## reportsits reprinted riddlemaster simplified
## 0.17 0.17 0.17 0.17
## sinks snarky solar spaceships
## 0.17 0.17 0.17 0.17
## speeches stepford susan theorized
## 0.17 0.17 0.17 0.17
## thinkingwhen traumatic ultimately upsetting
## 0.17 0.17 0.17 0.17
## ushers wads wellmeaning writerauthor
## 0.17 0.17 0.17 0.17
## detail think many loved
## 0.16 0.16 0.16 0.16
## believe right missing thing
## 0.16 0.16 0.16 0.16
## grammatical figure scenes reason
## 0.16 0.16 0.16 0.16
## relationship ability dialogue often
## 0.16 0.16 0.16 0.16
## told typos twice way
## 0.16 0.16 0.16 0.15
## isnt worth try something
## 0.15 0.15 0.15 0.15
## nothing know people almost
## 0.15 0.15 0.15 0.15
## family theyre beyond color
## 0.15 0.15 0.15 0.15
## drive info though detective
## 0.15 0.15 0.15 0.15
## someone added finish might
## 0.14 0.14 0.14 0.14
## several another last sentence
## 0.14 0.14 0.14 0.14
## james part supposed chapter
## 0.14 0.14 0.14 0.14
## character man women away
## 0.14 0.14 0.14 0.14
## black confused dropped friends
## 0.14 0.14 0.14 0.14
## every cut exactly role
## 0.14 0.14 0.14 0.14
## shall ask apart hey
## 0.14 0.14 0.14 0.14
## mother please uncle chance
## 0.14 0.14 0.14 0.13
## wasted will back end
## 0.13 0.13 0.13 0.13
## check interest forth making
## 0.13 0.13 0.13 0.13
## everything work drags doesnt
## 0.13 0.13 0.13 0.13
## earth less done turns
## 0.13 0.13 0.13 0.13
## apparently front white whole
## 0.13 0.13 0.13 0.13
## excited worst year sounds
## 0.13 0.13 0.13 0.13
## together grew hand learned
## 0.13 0.13 0.13 0.13
## remember knowing jerk single
## 0.13 0.13 0.13 0.13
## appears virtually ways jumping
## 0.13 0.13 0.13 0.13
## blurb hundreds followed greatly
## 0.13 0.13 0.13 0.13
## given love much got
## 0.12 0.12 0.12 0.12
## husband wanted frustrating either
## 0.12 0.12 0.12 0.12
## lacked use wasnt reader
## 0.12 0.12 0.12 0.12
## thinking bother finally accurate
## 0.12 0.12 0.12 0.12
## crazy ever sexy main
## 0.12 0.12 0.12 0.12
## choice kids decided whats
## 0.12 0.12 0.12 0.12
## awful partner yes tied
## 0.12 0.12 0.12 0.12
## respect male found stars
## 0.12 0.12 0.11 0.11
## authors etc finished first
## 0.11 0.11 0.11 0.11
## dead good two reading
## 0.11 0.11 0.11 0.11
## able seemed times case
## 0.11 0.11 0.11 0.11
## says tells line different
## 0.11 0.11 0.11 0.11
## instead around badly act
## 0.11 0.10 0.10 0.10
## feel plastic frustrated taking
## 0.10 0.10 0.10 0.10
## throws traits career later
## 0.10 0.10 0.10 0.10
## curious okay fiction worked
## 0.10 0.10 0.10 0.10
## began begin bully child
## 0.10 0.10 0.10 0.10
## collect everyone exhausting happily
## 0.10 0.10 0.10 0.10
## pink pull reference straw
## 0.10 0.10 0.10 0.10
## saying arent far looked
## 0.10 0.10 0.10 0.10
## super spent easily caught
## 0.10 0.10 0.10 0.10
## continuity particular product theres
## 0.10 0.10 0.10 0.10
## execution model seen wore
## 0.10 0.10 0.10 0.10
## death rescued responsible shallow
## 0.10 0.10 0.10 0.10
## shannon tension willing falls
## 0.10 0.10 0.10 0.10
## win cultures girls victim
## 0.10 0.10 0.10 0.10
## finds prude quote awkward
## 0.10 0.10 0.10 0.10
## persons process afraid kid
## 0.10 0.10 0.10 0.10
## prepared andor asking
## 0.10 0.10 0.10
##
##
## Palabra: time
## $time
## waste suddenly adopted aunt
## 0.45 0.32 0.32 0.32
## tension visits weeks top
## 0.32 0.32 0.32 0.29
## name woman apart act
## 0.28 0.28 0.28 0.27
## agoi boredom bridge captain
## 0.27 0.27 0.27 0.27
## couldntfor descriptioni discovered duplication
## 0.27 0.27 0.27 0.27
## elements fascinated inserted journaling
## 0.27 0.27 0.27 0.27
## map occasion photos printed
## 0.27 0.27 0.27 0.27
## printing scrapbook shown spell
## 0.27 0.27 0.27 0.27
## stood titanic baby dohner
## 0.27 0.27 0.27 0.27
## enforcer equally grady heat
## 0.27 0.27 0.27 0.27
## herselfi listen mate mating
## 0.27 0.27 0.27 0.27
## mika minnie omar omars
## 0.27 0.27 0.27 0.27
## pretend purrfect regard safety
## 0.27 0.27 0.27 0.27
## wellbeing weres whines reading
## 0.27 0.27 0.27 0.25
## usage seeing regretted introduced
## 0.25 0.25 0.25 0.25
## learned page nick caught
## 0.25 0.25 0.25 0.25
## particular advice gang move
## 0.25 0.25 0.25 0.25
## dont female years told
## 0.24 0.24 0.24 0.24
## paragraphs hey uncle even
## 0.24 0.24 0.24 0.23
## making tell things another
## 0.23 0.23 0.23 0.22
## appealing human mystery mother
## 0.22 0.22 0.22 0.22
## raped long able character
## 0.22 0.21 0.21 0.21
## main often used characters
## 0.21 0.21 0.21 0.20
## reason year check took
## 0.20 0.20 0.19 0.19
## moving role knowing running
## 0.19 0.19 0.19 0.19
## factor virtually ago believes
## 0.19 0.19 0.19 0.19
## greatly make biggest fell
## 0.19 0.18 0.18 0.18
## free native wont frame
## 0.18 0.18 0.18 0.18
## wasting friend loves father
## 0.18 0.18 0.18 0.18
## adds glove pace meaning
## 0.18 0.18 0.18 0.18
## bam emotion hardly wow
## 0.18 0.18 0.18 0.18
## continuity ones product room
## 0.18 0.18 0.18 0.18
## ongoing seen death rescued
## 0.18 0.18 0.18 0.18
## responsible shallow shannon willing
## 0.18 0.18 0.18 0.18
## explained known zero means
## 0.18 0.18 0.18 0.18
## keeps battered independent introverted
## 0.18 0.17 0.17 0.17
## petrified silliest smile split
## 0.17 0.17 0.17 0.17
## struggled amusing became luck
## 0.17 0.17 0.17 0.17
## simplistic students teachers conflicting
## 0.17 0.17 0.17 0.17
## dictionary ebonics goodness grind
## 0.17 0.17 0.17 0.17
## methodology patterns plainly rapper
## 0.17 0.17 0.17 0.17
## waffle wise continue everything
## 0.17 0.17 0.17 0.17
## avid carpet meacutenage success
## 0.17 0.17 0.17 0.17
## trudge walked still every
## 0.17 0.17 0.17 0.17
## names humorous whats andrea
## 0.17 0.17 0.17 0.17
## dislikable dispicable fallen received
## 0.17 0.17 0.17 0.17
## relatives typos hope partner
## 0.17 0.17 0.17 0.17
## middle adversary allegances allto
## 0.17 0.17 0.17 0.17
## appearenceslyra assailants auntadoptive backstory
## 0.17 0.17 0.17 0.17
## beau becomes bizarre brain
## 0.17 0.17 0.17 0.17
## brandnicks brunetteblonde causes cell
## 0.17 0.17 0.17 0.17
## checking chula ciana classically
## 0.17 0.17 0.17 0.17
## clearly clunky cracked cult
## 0.17 0.17 0.17 0.17
## darkhairedblonde degree diary discovery
## 0.17 0.17 0.17 0.17
## doctor driven encourages engagement
## 0.17 0.17 0.17 0.17
## examination exposition farm fingerviolated
## 0.17 0.17 0.17 0.17
## formatting graduate guides handsome
## 0.17 0.17 0.17 0.17
## helpfully hide hiding hospital
## 0.17 0.17 0.17 0.17
## hunger important inherits intact
## 0.17 0.17 0.17 0.17
## killing killrape lazy lexi
## 0.17 0.17 0.17 0.17
## lube lustmeanwhile lyra lyras
## 0.17 0.17 0.17 0.17
## magician morebottom motivation multiple
## 0.17 0.17 0.17 0.17
## nightspot onboard overreliance parapsychology
## 0.17 0.17 0.17 0.17
## presumed previous proofed readingan
## 0.17 0.17 0.17 0.17
## reasonable referred santera seville
## 0.17 0.17 0.17 0.17
## spirit stepmother stethoscope stone
## 0.17 0.17 0.17 0.17
## stones subsequent survivethe swore
## 0.17 0.17 0.17 0.17
## target theyd thrilled tone
## 0.17 0.17 0.17 0.17
## university unwanted urge viceral
## 0.17 0.17 0.17 0.17
## virginal virginity vkarandall weight
## 0.17 0.17 0.17 0.17
## woods worselyra wretched advance
## 0.17 0.17 0.17 0.17
## proof sme stupidityauthors stupidly
## 0.17 0.17 0.17 0.17
## techniqueit directed introducing linked
## 0.17 0.17 0.17 0.17
## sagasince vague asside attractive
## 0.17 0.17 0.17 0.17
## height leads overactive starters
## 0.17 0.17 0.17 0.17
## terminology wifes arse cuss
## 0.17 0.17 0.17 0.17
## cusses irritating occasionally park
## 0.17 0.17 0.17 0.17
## public ravaged attracted hiagh
## 0.17 0.17 0.17 0.17
## ick messed snowbound snowed
## 0.17 0.17 0.17 0.17
## wind winds absolutly actor
## 0.17 0.17 0.17 0.17
## agreei bookif cadfael catches
## 0.17 0.17 0.17 0.17
## choose commentsamazon deceased disliked
## 0.17 0.17 0.17 0.17
## ellis episodes humor intelligent
## 0.17 0.17 0.17 0.17
## medieval miscast notthere partly
## 0.17 0.17 0.17 0.17
## period peters plod production
## 0.17 0.17 0.17 0.17
## scripted sheriff solved suggesting
## 0.17 0.17 0.17 0.17
## television books put writer
## 0.17 0.16 0.16 0.16
## now ends sure never
## 0.16 0.15 0.15 0.15
## possible storyline take perhaps
## 0.15 0.15 0.15 0.15
## last picked probably speech
## 0.15 0.15 0.15 0.15
## family idea guys return
## 0.15 0.15 0.15 0.15
## tedious dropped meet different
## 0.15 0.15 0.15 0.15
## explain stand color exactly
## 0.15 0.15 0.15 0.15
## fact deal evil parents
## 0.15 0.15 0.15 0.15
## blog figured detail think
## 0.15 0.15 0.14 0.14
## rather written complete review
## 0.14 0.14 0.14 0.14
## tried lets instead wasted
## 0.14 0.14 0.14 0.13
## takes american good husband
## 0.13 0.13 0.13 0.13
## worse attention big english
## 0.13 0.13 0.13 0.13
## month poor along hated
## 0.13 0.13 0.13 0.13
## people reader turns least
## 0.13 0.13 0.13 0.13
## dialogue enjoyment leading beautiful
## 0.13 0.13 0.13 0.13
## significant remember called talking
## 0.13 0.13 0.13 0.13
## example detective solve acts
## 0.13 0.13 0.13 0.13
## bed cares comes forward
## 0.13 0.13 0.13 0.13
## tries based male given
## 0.13 0.13 0.13 0.12
## much horrible understand finished
## 0.12 0.12 0.12 0.12
## added dead made several
## 0.12 0.12 0.12 0.12
## chapters issue sentence seems
## 0.12 0.12 0.12 0.12
## cant hero old half
## 0.12 0.12 0.12 0.12
## men entire blah guy
## 0.12 0.12 0.12 0.11
## trouble label confident forced
## 0.11 0.11 0.11 0.11
## personality scared stranger world
## 0.11 0.11 0.11 0.11
## badly examples show built
## 0.11 0.11 0.11 0.11
## history money reviews seemed
## 0.11 0.11 0.11 0.11
## unclear murder liked work
## 0.11 0.11 0.11 0.11
## died avoid fooled case
## 0.11 0.11 0.11 0.11
## less makes onedimensional theyre
## 0.11 0.11 0.11 0.11
## negative dragged storytelling absolutely
## 0.11 0.11 0.11 0.11
## favorite later words worst
## 0.11 0.11 0.11 0.11
## repeated appeal couple previously
## 0.11 0.11 0.11 0.11
## mess local day happened
## 0.11 0.11 0.11 0.11
## count beat body child
## 0.11 0.11 0.11 0.11
## cut impression sadly sort
## 0.11 0.11 0.11 0.11
## concept disjointed scene brother
## 0.11 0.11 0.11 0.11
## protagonists instant smell suppose
## 0.11 0.11 0.11 0.11
## letdown ratings repeat towards
## 0.11 0.11 0.11 0.11
## tree amazing execution download
## 0.11 0.11 0.11 0.11
## purchasing lots teenager barely
## 0.11 0.11 0.11 0.11
## bet despite duke fit
## 0.11 0.11 0.11 0.11
## importance intelligence kidnapping masters
## 0.11 0.11 0.11 0.11
## michael places prime provides
## 0.11 0.11 0.11 0.11
## provoke responses ship shows
## 0.11 0.11 0.11 0.11
## surely references types importantly
## 0.11 0.11 0.11 0.11
## extreme cheat skin prude
## 0.11 0.11 0.11 0.11
## truth posted screaming charcters
## 0.11 0.11 0.11 0.11
## theme helpful stomach disturbing
## 0.11 0.11 0.11 0.11
## mysteries women line werewolf
## 0.11 0.10 0.10 0.10
## shall truly wouldnt always
## 0.10 0.10 0.10 0.10
## mind
## 0.10
##
##
## Palabra: dont
## $dont
## yes woman none asks sign
## 0.41 0.33 0.33 0.33 0.33
## know alaskan allow beatingand bothers
## 0.31 0.29 0.29 0.29 0.29
## clients condescending condone dealing deserves
## 0.29 0.29 0.29 0.29 0.29
## documents dumba estate hating inspections
## 0.29 0.29 0.29 0.29 0.29
## mansionthe owners reasoning rent reynolds
## 0.29 0.29 0.29 0.29 0.29
## snooty tiffany violence aaaaaannnnd account
## 0.29 0.29 0.29 0.29 0.29
## adviceyup affects airplanes alexander allwise
## 0.29 0.29 0.29 0.29 0.29
## andre andspouts anybody bear birthday
## 0.29 0.29 0.29 0.29 0.29
## boat bookwhat coolly cooper decorated
## 0.29 0.29 0.29 0.29 0.29
## dohuhmaybe dreams experiencing fly gaps
## 0.29 0.29 0.29 0.29 0.29
## generalizations lloyd meanspirited minutiae mira
## 0.29 0.29 0.29 0.29 0.29
## miras missingi mix mood norton
## 0.29 0.29 0.29 0.29 0.29
## participates party permission poem ponderous
## 0.29 0.29 0.29 0.29 0.29
## prospective reportsits reprinted riddlemaster simplified
## 0.29 0.29 0.29 0.29 0.29
## sinks snarky solar spaceships speeches
## 0.29 0.29 0.29 0.29 0.29
## stepford susan theorized thinkingwhen traumatic
## 0.29 0.29 0.29 0.29 0.29
## ultimately upsetting ushers wads wellmeaning
## 0.29 0.29 0.29 0.29 0.29
## writerauthor isnt hands can hang
## 0.29 0.28 0.27 0.26 0.26
## mystery totally towards room responses
## 0.26 0.26 0.26 0.26 0.26
## ship strength disturbing really issue
## 0.26 0.26 0.26 0.25 0.25
## man kids honestly socalled time
## 0.25 0.25 0.25 0.25 0.24
## waste throughout things even help
## 0.24 0.24 0.24 0.23 0.23
## hes agree guy never family
## 0.23 0.23 0.22 0.22 0.22
## trust gives respect make end
## 0.22 0.22 0.22 0.21 0.21
## several doesnt lets minute another
## 0.21 0.21 0.21 0.21 0.20
## new thought guys top strong
## 0.20 0.20 0.20 0.20 0.20
## behavior ground safe called theres
## 0.20 0.20 0.20 0.20 0.20
## move parents species followed biggest
## 0.20 0.20 0.20 0.20 0.19
## others care culprit stupid want
## 0.19 0.19 0.19 0.19 0.19
## character hed random join mess
## 0.19 0.19 0.19 0.19 0.19
## played arent disjointed emotion nick
## 0.19 0.19 0.19 0.19 0.19
## screwing likable agonizing kidnapping prime
## 0.19 0.19 0.19 0.19 0.19
## behind rape quote everybody persons
## 0.19 0.19 0.19 0.19 0.19
## process afraid kid prepared andor
## 0.19 0.19 0.19 0.19 0.19
## asking beware blind cruise date
## 0.19 0.18 0.18 0.18 0.18
## honest needless simply think will
## 0.18 0.18 0.18 0.18 0.18
## battered independent introverted petrified silliest
## 0.18 0.18 0.18 0.18 0.18
## smile split struggled went loved
## 0.18 0.18 0.18 0.18 0.18
## cant hate relationship adult women
## 0.18 0.18 0.18 0.18 0.18
## said ashley brighton brought jumps
## 0.18 0.18 0.18 0.18 0.18
## powerful powers lena matthews reallymaybe
## 0.18 0.18 0.18 0.18 0.18
## sleeping truly andrea dislikable dispicable
## 0.18 0.18 0.18 0.18 0.18
## fallen received relatives twice buddies
## 0.18 0.18 0.18 0.18 0.18
## dexter donaldsons examplethis folks football
## 0.18 0.18 0.18 0.18 0.18
## friendsin heart jocks obsessed psychopath
## 0.18 0.18 0.18 0.18 0.18
## psychopathic sources steven accept afterwards
## 0.18 0.18 0.18 0.18 0.18
## alpha argernon belt berrr borderline
## 0.18 0.18 0.18 0.18 0.18
## brings casey caseys chastity collis
## 0.18 0.18 0.18 0.18 0.18
## cool couldve counterparts culture cyborgs
## 0.18 0.18 0.18 0.18 0.18
## dated deed dynamic gamechanger holding
## 0.18 0.18 0.18 0.18 0.18
## kidnap learns meill necessarily orgasm
## 0.18 0.18 0.18 0.18 0.18
## pain parades pointyeared rals repeatedly
## 0.18 0.18 0.18 0.18 0.18
## replace rever silent somebody sweet
## 0.18 0.18 0.18 0.18 0.18
## ties unbounded warriorsi wear whatever
## 0.18 0.18 0.18 0.18 0.18
## wouldve yeai zorn apologies backbone
## 0.18 0.18 0.18 0.18 0.18
## caves counted cow doctorthen drugging
## 0.18 0.18 0.18 0.18 0.18
## geezand handcuff handcuffed handcuffing handcuffs
## 0.18 0.18 0.18 0.18 0.18
## headboard headway hurting involuntary locks
## 0.18 0.18 0.18 0.18 0.18
## loosen lustful notes problemthe protect
## 0.18 0.18 0.18 0.18 0.18
## riding scattered scream shot standing
## 0.18 0.18 0.18 0.18 0.18
## steps sticking swallow swallowing teases
## 0.18 0.18 0.18 0.18 0.18
## thatauthor thesaurusthe toe umhe wownot
## 0.18 0.18 0.18 0.18 0.18
## complain flick sexiness streamed back
## 0.18 0.18 0.18 0.18 0.17
## say later tell dohners someone
## 0.17 0.17 0.17 0.17 0.16
## free talk ready negative incorrect
## 0.16 0.16 0.16 0.16 0.16
## beyond exactly ask closet please
## 0.16 0.16 0.16 0.16 0.16
## love understand makes words old
## 0.15 0.15 0.15 0.15 0.15
## create felt youre expect female
## 0.15 0.14 0.14 0.14 0.14
## lead may worse youll paper
## 0.14 0.14 0.14 0.14 0.14
## yeah drags reader boy bother
## 0.14 0.14 0.14 0.14 0.14
## house excited young leading sexy
## 0.14 0.14 0.14 0.14 0.14
## saves save appealing main real
## 0.14 0.14 0.14 0.14 0.14
## shes slap grew significant missed
## 0.14 0.14 0.14 0.14 0.14
## decided always hour eyes till
## 0.14 0.14 0.14 0.14 0.14
## bed comes tries huge redeem
## 0.14 0.14 0.14 0.14 0.14
## adventure thoughts hundreds lives greatly
## 0.14 0.14 0.14 0.14 0.14
## shouldnt agent anywhere horrible dead
## 0.14 0.14 0.14 0.13 0.13
## name people seemed trying series
## 0.13 0.13 0.13 0.13 0.13
## ability says half look men
## 0.13 0.13 0.13 0.13 0.13
## told tied books gave see
## 0.13 0.13 0.12 0.12 0.12
## many maybe try finished something
## 0.12 0.12 0.12 0.12 0.12
## added complete confident fell native
## 0.12 0.12 0.12 0.12 0.12
## scared storyline stranger world around
## 0.12 0.12 0.12 0.12 0.12
## call reading act point right
## 0.12 0.12 0.12 0.12 0.12
## murder plastic fooled frustrated onedimensional
## 0.12 0.12 0.12 0.12 0.12
## taking regretted dropped favorite seriously
## 0.12 0.12 0.12 0.12 0.12
## tells winded friends year couple
## 0.12 0.12 0.12 0.12 0.12
## count fiction worked adds glove
## 0.12 0.12 0.12 0.12 0.12
## introduced pace reference hadnt joy
## 0.12 0.12 0.12 0.12 0.12
## drugged hardly letdown ratings repeat
## 0.12 0.12 0.12 0.12 0.12
## wow suddenly finishing explained fit
## 0.12 0.12 0.12 0.12 0.12
## known zero note apologize hurt
## 0.12 0.12 0.12 0.12 0.12
## breaking win inside cultures girls
## 0.12 0.12 0.12 0.12 0.12
## victim finds mary acted butt
## 0.12 0.12 0.12 0.12 0.12
## divorce inconsistencies papers seconds supposedly
## 0.12 0.12 0.12 0.12 0.12
## truth balls chance much ends
## 0.12 0.12 0.11 0.11 0.11
## knew trouble better forced got
## 0.11 0.11 0.11 0.11 0.11
## personality nothing speech thats everything
## 0.11 0.11 0.11 0.11 0.11
## liked anymore school wish ive
## 0.11 0.11 0.11 0.11 0.11
## reasons useless amount killed leave
## 0.11 0.11 0.11 0.11 0.11
## final role fact hopes info
## 0.11 0.11 0.11 0.11 0.11
## change suppose apart hours download
## 0.11 0.11 0.11 0.11 0.11
## event system late set written
## 0.11 0.11 0.11 0.10 0.10
## ridiculous pages wanted reviews figure
## 0.10 0.10 0.10 0.10 0.10
## thinking gets involved feels ill
## 0.10 0.10 0.10 0.10 0.10
## page
## 0.10
##
##
## Palabra: books
## $books
## move masters responses ship
## 0.44 0.43 0.43 0.43
## parents enjoyment attention adult
## 0.42 0.39 0.37 0.37
## pages avoid disappointed storytelling
## 0.36 0.36 0.36 0.36
## friend adopted aunt visits
## 0.36 0.36 0.36 0.36
## weeks andor adversary allegances
## 0.36 0.36 0.35 0.35
## allto appearenceslyra assailants auntadoptive
## 0.35 0.35 0.35 0.35
## backstory beau becomes bizarre
## 0.35 0.35 0.35 0.35
## brain brandnicks brunetteblonde causes
## 0.35 0.35 0.35 0.35
## cell checking chula ciana
## 0.35 0.35 0.35 0.35
## classically clearly clunky cracked
## 0.35 0.35 0.35 0.35
## cult darkhairedblonde degree diary
## 0.35 0.35 0.35 0.35
## discovery doctor driven encourages
## 0.35 0.35 0.35 0.35
## engagement examination exposition farm
## 0.35 0.35 0.35 0.35
## fingerviolated formatting graduate guides
## 0.35 0.35 0.35 0.35
## handsome helpfully hide hiding
## 0.35 0.35 0.35 0.35
## hospital hunger important inherits
## 0.35 0.35 0.35 0.35
## intact killing killrape lazy
## 0.35 0.35 0.35 0.35
## lexi lube lustmeanwhile lyra
## 0.35 0.35 0.35 0.35
## lyras magician morebottom motivation
## 0.35 0.35 0.35 0.35
## multiple nightspot onboard overreliance
## 0.35 0.35 0.35 0.35
## parapsychology presumed previous proofed
## 0.35 0.35 0.35 0.35
## readingan reasonable referred santera
## 0.35 0.35 0.35 0.35
## seville spirit stepmother stethoscope
## 0.35 0.35 0.35 0.35
## stone stones subsequent survivethe
## 0.35 0.35 0.35 0.35
## swore target theyd thrilled
## 0.35 0.35 0.35 0.35
## tone university unwanted urge
## 0.35 0.35 0.35 0.35
## viceral virginal virginity vkarandall
## 0.35 0.35 0.35 0.35
## weight woods worselyra wretched
## 0.35 0.35 0.35 0.35
## actor agreei bookif cadfael
## 0.35 0.35 0.35 0.35
## catches choose commentsamazon deceased
## 0.35 0.35 0.35 0.35
## disliked ellis episodes humor
## 0.35 0.35 0.35 0.35
## intelligent medieval miscast notthere
## 0.35 0.35 0.35 0.35
## partly period peters plod
## 0.35 0.35 0.35 0.35
## production scripted sheriff solved
## 0.35 0.35 0.35 0.35
## suggesting television detail review
## 0.35 0.35 0.34 0.34
## post still based issue
## 0.34 0.34 0.34 0.31
## young local role despite
## 0.30 0.30 0.30 0.30
## evil explained kidnapping prime
## 0.30 0.30 0.30 0.30
## types persons fact ways
## 0.30 0.30 0.29 0.28
## see reader done allowed
## 0.27 0.27 0.27 0.27
## seems claims credibility drain
## 0.26 0.26 0.26 0.26
## enlisted generally member pagesi
## 0.26 0.26 0.26 0.26
## personal preference refer semi
## 0.26 0.26 0.26 0.26
## service siblings size wishing
## 0.26 0.26 0.26 0.26
## alone anatomy appropriatefirst cartwrights
## 0.26 0.26 0.26 0.26
## considerate degrading earlier finer
## 0.26 0.26 0.26 0.26
## growing hint master mastersubmissive
## 0.26 0.26 0.26 0.26
## naturally position protective qualities
## 0.26 0.26 0.26 0.26
## reminded revealing saw sparxi
## 0.26 0.26 0.26 0.26
## strictly touch vivien watched
## 0.26 0.26 0.26 0.26
## wherein wherever aaaaaannnnd account
## 0.26 0.26 0.26 0.26
## adviceyup affects airplanes alexander
## 0.26 0.26 0.26 0.26
## allwise andre andspouts anybody
## 0.26 0.26 0.26 0.26
## bear birthday boat bookwhat
## 0.26 0.26 0.26 0.26
## coolly cooper decorated dohuhmaybe
## 0.26 0.26 0.26 0.26
## dreams experiencing fly gaps
## 0.26 0.26 0.26 0.26
## generalizations lloyd meanspirited minutiae
## 0.26 0.26 0.26 0.26
## mira miras missingi mix
## 0.26 0.26 0.26 0.26
## mood norton participates party
## 0.26 0.26 0.26 0.26
## permission poem ponderous prospective
## 0.26 0.26 0.26 0.26
## reportsits reprinted riddlemaster simplified
## 0.26 0.26 0.26 0.26
## sinks snarky solar spaceships
## 0.26 0.26 0.26 0.26
## speeches stepford susan theorized
## 0.26 0.26 0.26 0.26
## thinkingwhen traumatic ultimately upsetting
## 0.26 0.26 0.26 0.26
## ushers wads wellmeaning writerauthor
## 0.26 0.26 0.26 0.26
## appealing ask clear will
## 0.25 0.25 0.25 0.24
## sure case top much
## 0.24 0.24 0.24 0.23
## never visiting seeing murder
## 0.23 0.23 0.23 0.23
## help drags died house
## 0.23 0.23 0.23 0.23
## dragged women leading repeated
## 0.23 0.23 0.23 0.23
## appeal previously mess count
## 0.23 0.23 0.23 0.23
## adds glove pace hadnt
## 0.23 0.23 0.23 0.23
## menage military instant bam
## 0.23 0.23 0.23 0.23
## smell nick suddenly comes
## 0.23 0.23 0.23 0.23
## responsible tries purchasing barely
## 0.23 0.23 0.23 0.23
## bet duke fit importance
## 0.23 0.23 0.23 0.23
## intelligence known michael places
## 0.23 0.23 0.23 0.23
## provides provoke stands virtually
## 0.23 0.23 0.23 0.23
## zero wished asks posted
## 0.23 0.23 0.23 0.23
## certainly greatly mysteries chance
## 0.23 0.23 0.23 0.22
## felt negative guys giving
## 0.22 0.22 0.22 0.22
## things pleasure name normally
## 0.22 0.22 0.21 0.21
## two series sort three
## 0.21 0.21 0.21 0.21
## scene agree keeps many
## 0.21 0.21 0.21 0.20
## dead times bad character
## 0.20 0.20 0.20 0.20
## later shes love keep
## 0.20 0.20 0.19 0.19
## another picked use reason
## 0.19 0.19 0.19 0.19
## makes pass ability buy
## 0.19 0.19 0.19 0.19
## reasons kids always mind
## 0.19 0.19 0.19 0.19
## trust steamy gives event
## 0.19 0.19 0.19 0.19
## gave isnt interested something
## 0.18 0.18 0.18 0.18
## woman wont even romance
## 0.18 0.18 0.18 0.18
## cant ive details readers
## 0.18 0.18 0.18 0.18
## virgin beautiful leaving exactly
## 0.18 0.18 0.18 0.18
## ground significant basic totally
## 0.18 0.18 0.18 0.18
## spent single appears solve
## 0.18 0.18 0.18 0.18
## redeem followed better low
## 0.18 0.18 0.17 0.17
## sense examples last thought
## 0.17 0.17 0.17 0.17
## left hed random career
## 0.17 0.17 0.17 0.17
## wrote difficulty hero began
## 0.17 0.17 0.17 0.17
## hang pull arent creepy
## 0.17 0.17 0.17 0.17
## due aspect room entire
## 0.17 0.17 0.17 0.17
## agonizing mother please raped
## 0.17 0.17 0.17 0.17
## omg inside erotic compared
## 0.17 0.17 0.17 0.17
## send quote punishment everybody
## 0.17 0.17 0.17 0.17
## process afraid kid prepared
## 0.17 0.17 0.17 0.17
## focused asking capture completion
## 0.17 0.17 0.16 0.16
## found joke loving praise
## 0.16 0.16 0.16 0.16
## rewritten severly time readreview
## 0.16 0.16 0.16 0.16
## authors else make really
## 0.16 0.16 0.16 0.16
## writers care figure doesnt
## 0.16 0.16 0.16 0.16
## bookwhere merely picking promoted
## 0.16 0.16 0.16 0.16
## scifi stuff relationship backstage
## 0.16 0.16 0.16 0.16
## bothering continuations hmmm infancy
## 0.16 0.16 0.16 0.16
## investment mature olivia reactions
## 0.16 0.16 0.16 0.16
## recall respond sensationally crazy
## 0.16 0.16 0.16 0.16
## used goes sick decided
## 0.16 0.16 0.16 0.16
## honestly baby dohner enforcer
## 0.16 0.16 0.16 0.16
## equally grady heat herselfi
## 0.16 0.16 0.16 0.16
## listen mate mating mika
## 0.16 0.16 0.16 0.16
## minnie omar omars pretend
## 0.16 0.16 0.16 0.16
## purrfect regard safety wellbeing
## 0.16 0.16 0.16 0.16
## weres whines yes christine
## 0.16 0.16 0.16 0.16
## feehan mistaken ward whoever
## 0.16 0.16 0.16 0.16
## baaaaad barbaras drool eye
## 0.16 0.16 0.16 0.16
## fabio fool judge numbing
## 0.16 0.16 0.16 0.16
## pic rolling targets address
## 0.16 0.16 0.16 0.16
## approved choices cliff mitts
## 0.16 0.16 0.16 0.16
## great guy may others
## 0.15 0.15 0.15 0.15
## money wasnt talk family
## 0.15 0.15 0.15 0.15
## looking writer actually ever
## 0.15 0.15 0.15 0.15
## rated romantic worst real
## 0.15 0.15 0.15 0.15
## killed look correct info
## 0.15 0.15 0.15 0.15
## somehow change shows system
## 0.15 0.15 0.15 0.15
## late areas given rock
## 0.15 0.14 0.14 0.14
## first written find know
## 0.14 0.14 0.14 0.14
## badly new seemed purchase
## 0.14 0.14 0.14 0.14
## without away old every
## 0.14 0.14 0.14 0.14
## mystery hey uncle college
## 0.14 0.14 0.14 0.14
## flashback ago someone went
## 0.14 0.14 0.13 0.13
## worse paper wanted entirely
## 0.13 0.13 0.13 0.13
## reading making right either
## 0.13 0.13 0.13 0.13
## supposed school gets excited
## 0.13 0.13 0.13 0.13
## years since lets purchased
## 0.13 0.13 0.13 0.13
## missed listed open seem
## 0.13 0.13 0.13 0.13
## cares huge adventure strength
## 0.13 0.13 0.13 0.13
## thoughts hundreds lives anywhere
## 0.13 0.13 0.13 0.13
## dont couldnt usually editing
## 0.12 0.12 0.12 0.12
## got reviews described heroine
## 0.12 0.12 0.12 0.12
## unless hoping humorous longer
## 0.12 0.12 0.12 0.12
## maybe style cover long
## 0.11 0.11 0.11 0.11
## however became act feeling
## 0.11 0.11 0.11 0.11
## plus second throughout consider
## 0.11 0.11 0.11 0.11
## tried literally main kind
## 0.11 0.11 0.11 0.11
## none cut sadly easily
## 0.11 0.11 0.11 0.11
## skip theres dohners lots
## 0.11 0.11 0.11 0.11
## jumped shifter confident forced
## 0.10 0.10 0.10 0.10
## say audience penny anymore
## 0.10 0.10 0.10 0.10
## eventually otherwise bland cunning
## 0.10 0.10 0.10 0.10
## painful reads twilight substance
## 0.10 0.10 0.10 0.10
## line explain reach loves
## 0.10 0.10 0.10 0.10
## stay beyond human pink
## 0.10 0.10 0.10 0.10
## question hopes meaning likable
## 0.10 0.10 0.10 0.10
## death gang rescued shallow
## 0.10 0.10 0.10 0.10
## shannon tension willing falls
## 0.10 0.10 0.10 0.10
## ashamed list useful draw
## 0.10 0.10 0.10 0.10
## excitement spend amazons mark
## 0.10 0.10 0.10 0.10
## quality topic
## 0.10 0.10
##
##
## Palabra: much
## $much
## said clear women duke
## 0.36 0.36 0.33 0.33
## places cant seems details
## 0.33 0.32 0.31 0.30
## see college love used
## 0.29 0.29 0.28 0.28
## entire lots adversary allegances
## 0.28 0.28 0.28 0.28
## allto appearenceslyra assailants auntadoptive
## 0.28 0.28 0.28 0.28
## backstory beau becomes bizarre
## 0.28 0.28 0.28 0.28
## brain brandnicks brunetteblonde causes
## 0.28 0.28 0.28 0.28
## cell checking chula ciana
## 0.28 0.28 0.28 0.28
## classically clearly clunky cracked
## 0.28 0.28 0.28 0.28
## cult darkhairedblonde degree diary
## 0.28 0.28 0.28 0.28
## discovery doctor driven encourages
## 0.28 0.28 0.28 0.28
## engagement examination exposition farm
## 0.28 0.28 0.28 0.28
## fingerviolated formatting graduate guides
## 0.28 0.28 0.28 0.28
## handsome helpfully hide hiding
## 0.28 0.28 0.28 0.28
## hospital hunger important inherits
## 0.28 0.28 0.28 0.28
## intact killing killrape lazy
## 0.28 0.28 0.28 0.28
## lexi lube lustmeanwhile lyra
## 0.28 0.28 0.28 0.28
## lyras magician morebottom motivation
## 0.28 0.28 0.28 0.28
## multiple nightspot onboard overreliance
## 0.28 0.28 0.28 0.28
## parapsychology presumed previous proofed
## 0.28 0.28 0.28 0.28
## readingan reasonable referred santera
## 0.28 0.28 0.28 0.28
## seville spirit stepmother stethoscope
## 0.28 0.28 0.28 0.28
## stone stones subsequent survivethe
## 0.28 0.28 0.28 0.28
## swore target theyd thrilled
## 0.28 0.28 0.28 0.28
## tone university unwanted urge
## 0.28 0.28 0.28 0.28
## viceral virginal virginity vkarandall
## 0.28 0.28 0.28 0.28
## weight woods worselyra wretched
## 0.28 0.28 0.28 0.28
## anticipation atticus blogspot com
## 0.28 0.28 0.28 0.28
## delights destined dot elusive
## 0.28 0.28 0.28 0.28
## glossed happenedokay haydeereviews initiate
## 0.28 0.28 0.28 0.28
## instantaneous irritation kelly lissa
## 0.28 0.28 0.28 0.28
## lovey marc mild morelets
## 0.28 0.28 0.28 0.28
## outlandish proclaiming redemptionsame rival
## 0.28 0.28 0.28 0.28
## storyto struggle undying unlike
## 0.28 0.28 0.28 0.28
## detail way youll murder
## 0.26 0.26 0.26 0.26
## done storytelling leading reviewer
## 0.26 0.26 0.26 0.26
## beautiful adds glove summary
## 0.26 0.26 0.26 0.26
## synopsis due detective seen
## 0.26 0.26 0.26 0.26
## kidnapping known masters stands
## 0.26 0.26 0.26 0.26
## trust fight mates wished
## 0.26 0.26 0.26 0.26
## first sexy something got
## 0.25 0.25 0.24 0.24
## really guys friend still
## 0.24 0.24 0.24 0.24
## officer evil parents challenge
## 0.24 0.24 0.24 0.24
## books better can case
## 0.23 0.23 0.23 0.23
## top sick isnt issue
## 0.23 0.23 0.22 0.22
## thats rest fact going
## 0.22 0.22 0.22 0.21
## accurate dramatic rated color
## 0.21 0.21 0.21 0.21
## likely already based many
## 0.21 0.21 0.21 0.20
## long pages times art
## 0.20 0.20 0.20 0.20
## wasnt house actually enjoy
## 0.20 0.20 0.20 0.20
## enjoyment fine incorrect seriously
## 0.20 0.20 0.20 0.20
## words significant goes eyes
## 0.20 0.20 0.20 0.20
## tiny appropriate redeem bestseller
## 0.20 0.20 0.20 0.20
## dead fell never nothing
## 0.19 0.19 0.19 0.19
## big sentence work died
## 0.19 0.19 0.19 0.19
## bad pretty avoid dragged
## 0.19 0.19 0.19 0.19
## career black boys favorite
## 0.19 0.19 0.19 0.19
## mean repeated aside previously
## 0.19 0.19 0.19 0.19
## mess local count beat
## 0.19 0.19 0.19 0.19
## began body bully impression
## 0.19 0.19 0.19 0.19
## sadly sort hadnt scene
## 0.19 0.19 0.19 0.19
## instant bam smell nick
## 0.19 0.19 0.19 0.19
## suddenly model adopted aunt
## 0.19 0.19 0.19 0.19
## visits weeks teenager barely
## 0.19 0.19 0.19 0.19
## bet despite explained fit
## 0.19 0.19 0.19 0.19
## importance intelligence michael prime
## 0.19 0.19 0.19 0.19
## provides provoke responses ship
## 0.19 0.19 0.19 0.19
## zero passion promises shut
## 0.19 0.19 0.19 0.19
## suffered acted butt inconsistencies
## 0.19 0.19 0.19 0.19
## motivations holes potential lost
## 0.19 0.19 0.18 0.18
## make woman action pass
## 0.18 0.18 0.18 0.18
## adult young amy apostrophes
## 0.18 0.18 0.18 0.18
## arethe blankenshipthe blood bomb
## 0.18 0.18 0.18 0.18
## booklol bound brotherhood childhood
## 0.18 0.18 0.18 0.18
## confuse crazy dagger damagedby
## 0.18 0.18 0.18 0.18
## disasterby evansbeautifully exes fiore
## 0.18 0.18 0.18 0.18
## form frostbeautiful huntress hystericalso
## 0.18 0.18 0.18 0.18
## jamie jealous jeaniene katie
## 0.18 0.18 0.18 0.18
## labeled languagewhere listened literally
## 0.18 0.18 0.18 0.18
## loosely mcguirerealby meanthis meokay
## 0.18 0.18 0.18 0.18
## nevernever obstacles occurrences overly
## 0.18 0.18 0.18 0.18
## possessive ruining saidi sentences
## 0.18 0.18 0.18 0.18
## separated seriesby seriouslynothing shape
## 0.18 0.18 0.18 0.18
## state stated successful suffering
## 0.18 0.18 0.18 0.18
## sweethearts wardthe yasome lets
## 0.18 0.18 0.18 0.18
## claims credibility drain enlisted
## 0.18 0.18 0.18 0.18
## generally member pagesi personal
## 0.18 0.18 0.18 0.18
## preference refer semi service
## 0.18 0.18 0.18 0.18
## siblings size wishing novella
## 0.18 0.18 0.18 0.18
## confusion ingredients par abcs
## 0.18 0.18 0.18 0.18
## academy achieved amends amicable
## 0.18 0.18 0.18 0.18
## andrews apparel armani bookthats
## 0.18 0.18 0.18 0.18
## braless breasts comforting committed
## 0.18 0.18 0.18 0.18
## designation device dick dresses
## 0.18 0.18 0.18 0.18
## engaging evans exploration fabulous
## 0.18 0.18 0.18 0.18
## feud flaggedthis fresh gruesome
## 0.18 0.18 0.18 0.18
## guessed hair heredoes herodetective
## 0.18 0.18 0.18 0.18
## himselfewwwww himwe humble initial
## 0.18 0.18 0.18 0.18
## insert intrigued introduces investigation
## 0.18 0.18 0.18 0.18
## isbut italian itpress leather
## 0.18 0.18 0.18 0.18
## led leering loafers matters
## 0.18 0.18 0.18 0.18
## meany mere mire mortals
## 0.18 0.18 0.18 0.18
## motor muscular music navigating
## 0.18 0.18 0.18 0.18
## nickname patience perpetrator police
## 0.18 0.18 0.18 0.18
## pool precinct press preston
## 0.18 0.18 0.18 0.18
## prestons rich rookie saccharine
## 0.18 0.18 0.18 0.18
## sensed sight sights signs
## 0.18 0.18 0.18 0.18
## simultaneously superior surmised surreptitiously
## 0.18 0.18 0.18 0.18
## tall teehee town trace
## 0.18 0.18 0.18 0.18
## traces tracethose upper verbs
## 0.18 0.18 0.18 0.18
## victims wealthy weighs wing
## 0.18 0.18 0.18 0.18
## withyou worship wrap delilah
## 0.18 0.18 0.18 0.18
## devlin eluded ffm flatand
## 0.18 0.18 0.18 0.18
## interaction intimate skeeved tolerable
## 0.18 0.18 0.18 0.18
## yuck arse cuss cusses
## 0.18 0.18 0.18 0.18
## irritating occasionally athletes camp
## 0.18 0.18 0.18 0.18
## charactersi chicken cuddle dare
## 0.18 0.18 0.18 0.18
## denial devices diatribes disappointskip
## 0.18 0.18 0.18 0.18
## disgusted embarrassing fluffy gayno
## 0.18 0.18 0.18 0.18
## gaythe gaythey gaythis herenopewe
## 0.18 0.18 0.18 0.18
## homophobe homophobic insensitive ladies
## 0.18 0.18 0.18 0.18
## ladiesbutif looooooves maverick nowhere
## 0.18 0.18 0.18 0.18
## offensive offensivei oftentimes onthis
## 0.18 0.18 0.18 0.18
## panic possibly proven psa
## 0.18 0.18 0.18 0.18
## racism sensethis sexist shade
## 0.18 0.18 0.18 0.18
## standards straightwe subplot tropeheavy
## 0.18 0.18 0.18 0.18
## tropes authenticity madit natchitoches
## 0.18 0.18 0.18 0.18
## natchitochesthe visited wikipedia among
## 0.18 0.18 0.18 0.18
## answer cheapest cleveland dawn
## 0.18 0.18 0.18 0.18
## degradationwriting episode escape escapees
## 0.18 0.18 0.18 0.18
## latest mistakei notion perpetuates
## 0.18 0.18 0.18 0.18
## rapedwhat reinforces romancei seriesbig
## 0.18 0.18 0.18 0.18
## slaveryyou tricks unfortunate damned
## 0.18 0.18 0.18 0.18
## elmore hped leonard plodding
## 0.18 0.18 0.18 0.18
## sample slowi writtenwith attacks
## 0.18 0.18 0.18 0.18
## iranian liking minority amounts
## 0.18 0.18 0.18 0.18
## explanations guidance revised rife
## 0.18 0.18 0.18 0.18
## tears vast arsenal car
## 0.18 0.18 0.18 0.18
## charactersnot descriptionunless discussing entertainment
## 0.18 0.18 0.18 0.18
## garageanyways mejust paranoid political
## 0.18 0.18 0.18 0.18
## scrolled vintage kidnapped use
## 0.18 0.18 0.17 0.17
## tell gay felt found
## 0.17 0.17 0.16 0.16
## description female care experience
## 0.16 0.16 0.16 0.16
## left supposed ive absolutely
## 0.16 0.16 0.16 0.16
## away ever reasons hands
## 0.16 0.16 0.16 0.16
## deal easily hours shows
## 0.16 0.16 0.16 0.16
## list think end name
## 0.16 0.15 0.15 0.15
## take vampire want relationship
## 0.15 0.15 0.15 0.15
## makes life old kind
## 0.15 0.15 0.15 0.15
## frankly super skimming crime
## 0.15 0.15 0.15 0.15
## treated cheap food lead
## 0.15 0.15 0.15 0.14
## worse completely loved made
## 0.14 0.14 0.14 0.14
## others entirely interest soon
## 0.14 0.14 0.14 0.14
## missing sex drags gets
## 0.14 0.14 0.14 0.14
## character least halfway silly
## 0.14 0.14 0.14 0.14
## unless dislike particularly virgin
## 0.14 0.14 0.14 0.14
## fair shes slap hand
## 0.14 0.14 0.14 0.14
## truly works basic listed
## 0.14 0.14 0.14 0.14
## far agree become ass
## 0.14 0.14 0.14 0.14
## reviewers single appears hope
## 0.14 0.14 0.14 0.14
## expert bed move huge
## 0.14 0.14 0.14 0.14
## virtually ways showing certainly
## 0.14 0.14 0.14 0.14
## enjoying decent terrible wanted
## 0.14 0.14 0.13 0.13
## sense last liked erotica
## 0.13 0.13 0.13 0.13
## hero term line head
## 0.13 0.13 0.13 0.13
## every definitely time couldnt
## 0.13 0.12 0.12 0.12
## etc let rather world
## 0.12 0.12 0.12 0.12
## cause even act reviews
## 0.12 0.12 0.12 0.12
## took feeling plus part
## 0.12 0.12 0.12 0.12
## development idea narrative dropped
## 0.12 0.12 0.12 0.12
## meet cut exactly saying
## 0.12 0.12 0.12 0.12
## ask order spent skip
## 0.12 0.12 0.12 0.12
## dont usually label sure
## 0.11 0.11 0.11 0.11
## intriguing errors biggest confident
## 0.11 0.11 0.11 0.11
## may native say low
## 0.11 0.11 0.11 0.11
## plot show plastic everything
## 0.11 0.11 0.11 0.11
## surprised talk theyre bland
## 0.11 0.11 0.11 0.11
## lack difficulty mistakes romantic
## 0.11 0.11 0.11 0.11
## separate wtf share killed
## 0.11 0.11 0.11 0.11
## stay spark professional continued
## 0.11 0.11 0.11 0.11
## played pull shall correct
## 0.11 0.11 0.11 0.11
## creepy menage military message
## 0.11 0.11 0.11 0.11
## fetched looked damn therefore
## 0.11 0.11 0.11 0.11
## somehow premise imagine place
## 0.11 0.11 0.11 0.11
## remaining mind descriptions suppose
## 0.11 0.11 0.11 0.11
## timeline hold particular agonizing
## 0.11 0.11 0.11 0.11
## amazing apparent execution girlfriend
## 0.11 0.11 0.11 0.11
## legs ongoing removed slogging
## 0.11 0.11 0.11 0.11
## thanks wore flashback blog
## 0.11 0.11 0.11 0.11
## apologize hurt ashamed thin
## 0.11 0.11 0.11 0.11
## dumb morbid playing skin
## 0.11 0.11 0.11 0.11
## prude send racist spend
## 0.11 0.11 0.11 0.11
## area punishment draft attempt
## 0.11 0.11 0.11 0.11
## anger endless prepared stick
## 0.11 0.11 0.11 0.11
## will expect didnt figure
## 0.10 0.10 0.10 0.10
## opinion years dark boss
## 0.10 0.10 0.10 0.10
## ill parts
## 0.10 0.10
##
##
## Palabra: reading
## $reading
## gives apologies backbone caves
## 0.33 0.29 0.29 0.29
## counted cow doctorthen drugging
## 0.29 0.29 0.29 0.29
## geezand handcuff handcuffed handcuffing
## 0.29 0.29 0.29 0.29
## handcuffs headboard headway hurting
## 0.29 0.29 0.29 0.29
## involuntary locks loosen lustful
## 0.29 0.29 0.29 0.29
## notes problemthe protect riding
## 0.29 0.29 0.29 0.29
## scattered scream shot standing
## 0.29 0.29 0.29 0.29
## steps sticking swallow swallowing
## 0.29 0.29 0.29 0.29
## teases thatauthor thesaurusthe toe
## 0.29 0.29 0.29 0.29
## umhe bigger hop near
## 0.29 0.29 0.29 0.29
## somethingall train waiting series
## 0.29 0.29 0.29 0.28
## happened several towards eyes
## 0.28 0.27 0.27 0.27
## middle apologize hurt breaking
## 0.27 0.27 0.27 0.27
## asks inconsistencies future time
## 0.27 0.27 0.27 0.25
## makes closet apart stop
## 0.25 0.25 0.25 0.24
## look editor please keep
## 0.24 0.24 0.23 0.22
## show trying correct always
## 0.22 0.22 0.22 0.22
## hours bed minute characters
## 0.22 0.22 0.22 0.21
## finished really guys grew
## 0.21 0.21 0.21 0.21
## safe things learned theres
## 0.21 0.21 0.21 0.21
## strength female kept character
## 0.21 0.20 0.20 0.20
## hes men keeps youre
## 0.20 0.20 0.20 0.19
## lost started usage making
## 0.19 0.19 0.19 0.19
## reason taking avid carpet
## 0.19 0.19 0.19 0.19
## meacutenage regretted success trudge
## 0.19 0.19 0.19 0.19
## walked wasting everyone introduced
## 0.19 0.19 0.19 0.19
## hadnt sick agree drugged
## 0.19 0.19 0.19 0.19
## agoi boredom bridge captain
## 0.19 0.19 0.19 0.19
## couldntfor descriptioni discovered duplication
## 0.19 0.19 0.19 0.19
## elements example fascinated inserted
## 0.19 0.19 0.19 0.19
## journaling map occasion photos
## 0.19 0.19 0.19 0.19
## printed printing room scrapbook
## 0.19 0.19 0.19 0.19
## shown spell stood titanic
## 0.19 0.19 0.19 0.19
## partner tension finishing advance
## 0.19 0.19 0.19 0.19
## means proof sme stupidityauthors
## 0.19 0.19 0.19 0.19
## stupidly techniqueit directed introducing
## 0.19 0.19 0.19 0.19
## linked sagasince vague acted
## 0.19 0.19 0.19 0.19
## butt divorce papers seconds
## 0.19 0.19 0.19 0.19
## sign supposedly homosexuality rathan
## 0.19 0.19 0.19 0.19
## rose selfishness bust fugue
## 0.19 0.19 0.19 0.19
## offwell beansthis coffee designerworshipping
## 0.19 0.19 0.19 0.19
## dog drink everybody expects
## 0.19 0.19 0.19 0.19
## featherheaded fluffheads frolicking glasses
## 0.19 0.19 0.19 0.19
## herethe lightweight materialistic practically
## 0.19 0.19 0.19 0.19
## prancing preground skippable stereotype
## 0.19 0.19 0.19 0.19
## tantrum temper trivial undependable
## 0.19 0.19 0.19 0.19
## wine booksbefore currently fredt
## 0.19 0.19 0.19 0.19
## lockman loser news stinker
## 0.19 0.19 0.19 0.19
## worthwhile arrives assigns brown
## 0.19 0.19 0.19 0.19
## decoy energetic fascination hypnotic
## 0.19 0.19 0.19 0.19
## lately lingering morning pools
## 0.19 0.19 0.19 0.19
## radiant undercover going didnt
## 0.19 0.19 0.18 0.18
## second often now act
## 0.18 0.18 0.18 0.17
## care needs cant throughout
## 0.17 0.17 0.17 0.17
## ready obvious return dialogue
## 0.17 0.17 0.17 0.17
## hands saying change note
## 0.17 0.17 0.17 0.17
## take know can tells
## 0.16 0.16 0.16 0.16
## told page paragraphs made
## 0.16 0.16 0.16 0.15
## might yeah boy house
## 0.15 0.15 0.15 0.15
## finally regret saves expert
## 0.15 0.15 0.15 0.15
## cares forward happy redeem
## 0.15 0.15 0.15 0.15
## cheated wont new seemed
## 0.15 0.14 0.14 0.14
## reader appealing hoping hour
## 0.14 0.14 0.14 0.14
## blah books think sounded
## 0.14 0.13 0.13 0.13
## better something immediately check
## 0.13 0.13 0.13 0.13
## became stopped feel help
## 0.13 0.13 0.13 0.13
## getting ever main tell
## 0.13 0.13 0.13 0.13
## none chance dont ends
## 0.13 0.12 0.12 0.12
## trouble try yet call
## 0.12 0.12 0.12 0.12
## frame either anymore family
## 0.12 0.12 0.12 0.12
## throws using negative cunning
## 0.12 0.12 0.12 0.12
## bisexual beyond child collect
## 0.12 0.12 0.12 0.12
## hang happily pace played
## 0.12 0.12 0.12 0.12
## protagonists knows hardly caught
## 0.12 0.12 0.12 0.12
## continuity create ones particular
## 0.12 0.12 0.12 0.12
## product suddenly ongoing known
## 0.12 0.12 0.12 0.12
## surely ago blog references
## 0.12 0.12 0.12 0.12
## bigot importantly disappointment support
## 0.12 0.12 0.12 0.12
## win morbid stopping compared
## 0.12 0.12 0.12 0.12
## angry holes prepared set
## 0.12 0.12 0.12 0.11
## first finish lead even
## 0.11 0.11 0.11 0.11
## thought part stupid review
## 0.11 0.11 0.11 0.11
## hard incorrect years says
## 0.11 0.11 0.11 0.11
## father behavior role shall
## 0.11 0.11 0.11 0.11
## search found end say
## 0.11 0.10 0.10 0.10
## however last without start
## 0.10 0.10 0.10 0.10
## head dohners
## 0.10 0.10