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(tidytext)
## Warning: package 'tidytext' was built under R version 4.3.2
library(stringr)
library(XML)
library(jsonlite)
library(rvest)
library(httr)
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ forcats   1.0.0     ✔ readr     2.1.4
## ✔ ggplot2   3.4.3     ✔ tibble    3.2.1
## ✔ lubridate 1.9.2     ✔ tidyr     1.3.0
## ✔ purrr     1.0.2
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter()         masks stats::filter()
## ✖ purrr::flatten()        masks jsonlite::flatten()
## ✖ readr::guess_encoding() masks rvest::guess_encoding()
## ✖ dplyr::lag()            masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors

Introducion

This assignment consists of two parts. Part 1 loads and tests the existing code in Chapter 2 from https://www.tidytextmining.com/sentiment. Part 2 is an extension of the code and analysis using the Brown Corpus and two lexicons, the mpqa and SentimentAnalysis lexicons.

The Brown corpus is composed of 501 texts. More information on the Brown corpus can be found at http://icame.uib.no/brown/bcm.html.

Part 1: Sentiment analysis of the Jane Austen Corpus

Part 1 of this assignment is the primary example code from https://www.tidytextmining.com/sentiment ## Load the data from the Jane Austen Corpus

library(janeaustenr)
## Warning: package 'janeaustenr' was built under R version 4.3.2
original_books <- austen_books() %>%
  group_by(book) %>%
  mutate(linenumber = row_number(),
         chapter = cumsum(str_detect(text, 
                                     regex("^chapter [\\divxlc]",
                                           ignore_case = TRUE)))) %>%
  ungroup()

head(original_books)
## # A tibble: 6 × 4
##   text                    book                linenumber chapter
##   <chr>                   <fct>                    <int>   <int>
## 1 "SENSE AND SENSIBILITY" Sense & Sensibility          1       0
## 2 ""                      Sense & Sensibility          2       0
## 3 "by Jane Austen"        Sense & Sensibility          3       0
## 4 ""                      Sense & Sensibility          4       0
## 5 "(1811)"                Sense & Sensibility          5       0
## 6 ""                      Sense & Sensibility          6       0

Tokenize the text of the six books in the Jane Austen corpus

library(tidytext)
tidy_books <- original_books %>%
  unnest_tokens(word, text)

head(tidy_books)
## # A tibble: 6 × 4
##   book                linenumber chapter word       
##   <fct>                    <int>   <int> <chr>      
## 1 Sense & Sensibility          1       0 sense      
## 2 Sense & Sensibility          1       0 and        
## 3 Sense & Sensibility          1       0 sensibility
## 4 Sense & Sensibility          3       0 by         
## 5 Sense & Sensibility          3       0 jane       
## 6 Sense & Sensibility          3       0 austen

Remove stop words from the tokenized words

data(stop_words)

tidy_books <- tidy_books %>%
  anti_join(stop_words)
## Joining with `by = join_by(word)`

Display the words in the afinn lexicon

library(tidytext)

head(get_sentiments("afinn"))
## # A tibble: 6 × 2
##   word       value
##   <chr>      <dbl>
## 1 abandon       -2
## 2 abandoned     -2
## 3 abandons      -2
## 4 abducted      -2
## 5 abduction     -2
## 6 abductions    -2

Display the words in the bing lexicon

head(get_sentiments("bing"))
## # A tibble: 6 × 2
##   word       sentiment
##   <chr>      <chr>    
## 1 2-faces    negative 
## 2 abnormal   negative 
## 3 abolish    negative 
## 4 abominable negative 
## 5 abominably negative 
## 6 abominate  negative

Display the words in the nrc lexicon

head(get_sentiments("nrc"))
## # A tibble: 6 × 2
##   word      sentiment
##   <chr>     <chr>    
## 1 abacus    trust    
## 2 abandon   fear     
## 3 abandon   negative 
## 4 abandon   sadness  
## 5 abandoned anger    
## 6 abandoned fear

Sentiment analysis using the bing lexicon

library(tidyr)

jane_austen_sentiment <- tidy_books %>%
  inner_join(get_sentiments("bing")) %>%
  count(book, index = linenumber %/% 80, sentiment) %>%
  pivot_wider(names_from = sentiment, values_from = n, values_fill = 0) %>% 
  mutate(sentiment = positive - negative)
## Joining with `by = join_by(word)`
## Warning in inner_join(., get_sentiments("bing")): Detected an unexpected many-to-many relationship between `x` and `y`.
## ℹ Row 131015 of `x` matches multiple rows in `y`.
## ℹ Row 5051 of `y` matches multiple rows in `x`.
## ℹ If a many-to-many relationship is expected, set `relationship =
##   "many-to-many"` to silence this warning.
head(jane_austen_sentiment)
## # A tibble: 6 × 5
##   book                index negative positive sentiment
##   <fct>               <dbl>    <int>    <int>     <int>
## 1 Sense & Sensibility     0       16       26        10
## 2 Sense & Sensibility     1       19       44        25
## 3 Sense & Sensibility     2       12       23        11
## 4 Sense & Sensibility     3       15       22         7
## 5 Sense & Sensibility     4       16       29        13
## 6 Sense & Sensibility     5       16       39        23
library(ggplot2)

ggplot(jane_austen_sentiment, aes(index, sentiment, fill = book)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~book, ncol = 2, scales = "free_x")

Part 2: Extension of Sentiment analysis

I am using the Brown Corpus. Data and information from the corpus is located at http://icame.uib.no/brown/bcm.html. I used python code to download the corpus, tokenize it, and saved it in a data frame. I then sorted the data frame by the count of tokens and saved the top 12 in a separate data frame. I then used the data for my analysis

Part 2.1

In this extension, I am using 6886 words from the mpqa word lexicon. The lexicon is read from a json file in Prof. William L Hamilton GitHub repository. William L Hamilton is an Assistant Professor at McGill University and Mila, working on machine learning, NLP, and network analysis.hip github repo can be found here https://github.com/williamleif

This code loads the mpqa seniment.

# Load the JSON lexicon data into an R data frame
mpqa_sentiment <- fromJSON("https://raw.githubusercontent.com/williamleif/socialsent/master/socialsent/data/lexicons/mpqa.json")
mpqa_df <- as.data.frame(mpqa_sentiment)

# This data frame is in a wide format with only one row 
# The columns represent the words and the single row consist of the sentiments with -1 for negative and 1 for positive sentiment. 

# Convert the data frame from wide to long format
mpqa_df <- pivot_longer(
  data = mpqa_df, 
  cols = everything(),        # Select all columns to make long
  names_to = "word",          # Name of the new column created from data frame column names
  values_to = "value"         # Name of the new column created from data frame values
)

# Rename data frame and mutate the data frame to add a column for negative/positive sentiment
mpqa <- mpqa_df |>
  mutate(
    sentiment = if_else(value == 1, "positive", "negative")
  )
# View the long data frame
head(mpqa)
## # A tibble: 6 × 3
##   word       value sentiment
##   <chr>      <int> <chr>    
## 1 fawn          -1 negative 
## 2 foul          -1 negative 
## 3 mirage        -1 negative 
## 4 aggression    -1 negative 
## 5 eligible       1 positive 
## 6 chatter       -1 negative
# Display the count of positive/negative sentiments
mpqa |> group_by(sentiment) |>
summarise(n = n())
## # A tibble: 2 × 2
##   sentiment     n
##   <chr>     <int>
## 1 negative   4590
## 2 positive   2296

Load the a selecion of texts from the Brown corpus.

The texts from the Brown corpus were read using a python code. A data frame was created of the 12 texts with the highest token counts. The python code and the data frame are in the github repo.

library(tidyr)
brown_corpus_top_12_token_count <- read_csv('https://raw.githubusercontent.com/hawa1983/Week-10-Assignment/main/brown_corpus_top_12_token_count.csv')
## Rows: 1833 Columns: 3
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (2): text_id, text
## dbl (1): linenumber
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
glimpse(brown_corpus_top_12_token_count)
## Rows: 1,833
## Columns: 3
## $ text_id    <chr> "cn29", "cn29", "cn29", "cn29", "cn29", "cn29", "cn29", "cn…
## $ text       <chr> "`` Bastards '' , he would say , `` all I did was put a bea…
## $ linenumber <dbl> 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, …

Tokenize the texts

library(tidytext)
tidy_brown_text <- brown_corpus_top_12_token_count %>%
  unnest_tokens(word, text)

head(tidy_brown_text)
## # A tibble: 6 × 3
##   text_id linenumber word    
##   <chr>        <dbl> <chr>   
## 1 cn29             1 bastards
## 2 cn29             1 he      
## 3 cn29             1 would   
## 4 cn29             1 say     
## 5 cn29             1 all     
## 6 cn29             1 i

Remove stop words from the text

data(stop_words)

tidy_brown_text <- tidy_brown_text %>%
  anti_join(stop_words)
## Joining with `by = join_by(word)`
head(tidy_brown_text)
## # A tibble: 6 × 3
##   text_id linenumber word     
##   <chr>        <dbl> <chr>    
## 1 cn29             1 bastards 
## 2 cn29             1 beat     
## 3 cn29             1 vivaldi  
## 4 cn29             1 stuff    
## 5 cn29             1 chair    
## 6 cn29             1 clobbered

Join the mpqa and the tidy_brown_sentiment tables.

This code joins the mpqa lexicon and the tidy_brown_text tables and calculate the sentiment for every 10 sentences.

library(tidyr)

tidy_brown_sentiment <- tidy_brown_text %>%
  inner_join(mpqa) %>%
  count(text_id, index = linenumber %/% 10, sentiment) %>%
  pivot_wider(names_from = sentiment, values_from = n, values_fill = 0) %>% 
  mutate(sentiment = positive - negative)
## Joining with `by = join_by(word)`
head(tidy_brown_sentiment)
## # A tibble: 6 × 5
##   text_id index negative positive sentiment
##   <chr>   <dbl>    <int>    <int>     <int>
## 1 cc14      135        2        1        -1
## 2 cc14      136       12       15         3
## 3 cc14      137        4       16        12
## 4 cc14      138        9       13         4
## 5 cc14      139        5       13         8
## 6 cc14      140       11        7        -4

Sentiments using the mpqa lexicon

The plots shows how the sentiment changed throughout the book. The texts with id cc14, ch17 and cn17 have mostly a positive sentiment. cn17 starts with positive sentiments. The texts in cp16, cp23, cp24, and cr03 are comprised mostly of negative sentiments. The texts in cn29, cp04, cp06 and cp15 are similarly composed mostly of negative seniments.

library(ggplot2)

ggplot(tidy_brown_sentiment, aes(index, sentiment, fill = text_id)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~text_id, ncol = 4, scales = "free_x")

## Part 2.2

This analysis used the SentimentAnalysis lexicon

Data sets in package ‘SentimentAnalysis’:

DictionaryGI Dictionary with opinionated words from the Harvard-IV dictionary as used in the General Inquirer software DictionaryHE Dictionary with opinionated words from Henry’s Financial dictionary DictionaryLM Dictionary with opinionated words from Loughran-McDonald Financial dictionary

These data sets are combined to create a single data frame

# Load the SentimentAnalysis package
library(SentimentAnalysis)
## Warning: package 'SentimentAnalysis' was built under R version 4.3.2
## 
## Attaching package: 'SentimentAnalysis'
## The following object is masked from 'package:base':
## 
##     write
data <- data(package = 'SentimentAnalysis')
sentiment_df <-rbind(
  tibble(word = DictionaryGI$negative) |>
  mutate(sentiment = "negative"),
  tibble(word = DictionaryGI$positive) |>
  mutate(sentiment = "positive"),
  tibble(word = DictionaryHE$negative) |>
  mutate(sentiment = "negative"),
  tibble(word = DictionaryHE$positive) |>
  mutate(sentiment = "positive"),
  tibble(word = DictionaryLM$negative) |>
  mutate(sentiment = "negative"),
  tibble(word = DictionaryLM$positive) |>
  mutate(sentiment = "positive")
  )

head(sentiment_df)
## # A tibble: 6 × 2
##   word        sentiment
##   <chr>       <chr>    
## 1 abandon     negative 
## 2 abandonment negative 
## 3 abate       negative 
## 4 abdicate    negative 
## 5 abhor       negative 
## 6 abject      negative

Join the SentimentAnalysis and the idy_brown_sentiment tables.

This code joins the SentimentAnalysis lexicon and the tidy_brown_text tables and calculate the sentiment for every 10 sentences.

library(tidyr)

tidy_brown_GI_sentiment <- tidy_brown_text %>%
  inner_join(sentiment_df) %>%
  count(text_id, index = linenumber %/% 10, sentiment) %>%
  pivot_wider(names_from = sentiment, values_from = n, values_fill = 0) %>% 
  mutate(sentiment = positive - negative)
## Joining with `by = join_by(word)`
## Warning in inner_join(., sentiment_df): Detected an unexpected many-to-many relationship between `x` and `y`.
## ℹ Row 2 of `x` matches multiple rows in `y`.
## ℹ Row 167 of `y` matches multiple rows in `x`.
## ℹ If a many-to-many relationship is expected, set `relationship =
##   "many-to-many"` to silence this warning.
head(tidy_brown_GI_sentiment)
## # A tibble: 6 × 5
##   text_id index negative positive sentiment
##   <chr>   <dbl>    <int>    <int>     <int>
## 1 cc14      135        2        0        -2
## 2 cc14      136        9       14         5
## 3 cc14      137        5       22        17
## 4 cc14      138        8       17         9
## 5 cc14      139        6       19        13
## 6 cc14      140        4        7         3

Sentiments using the SentimentAnalysis package

The plots shows how the sentiment changed throughout the book. The texts with id cc14 have mostly a positive sentiments. The rest of the other texts are composed mostly of negative sentiments.Overall, the sentiments analysis is similar to that of the mpqa lexicon. However, this lexicon shows more positive sentiments in cr03 than did th mpqa sentiment.

library(ggplot2)

ggplot(tidy_brown_GI_sentiment, aes(index, sentiment, fill = text_id)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~text_id, ncol = 4, scales = "free_x")

Part 2.3 Analysis of the sentiments using the qdap lexicon

The qdapDictionaries package contains datasets that have sentiments for action, amplifying, de-amplifying, negation, negative, positive, power, strength, weakness, and submission word lists. In this extension, I will create a separate data frame for each word list with a second column for sentiment for that word list. I then combine all the data frames to generate a qdap lexicon.I then mutated the data frame to create the following net sentiments

sentiment = positive - negative strength = strong - weak amplify = ampplification - deamplification.

# Load the qdapDictionaries package
library(qdap)
## Warning: package 'qdap' was built under R version 4.3.2
## Loading required package: qdapDictionaries
## Loading required package: qdapRegex
## Warning: package 'qdapRegex' was built under R version 4.3.2
## 
## Attaching package: 'qdapRegex'
## The following object is masked from 'package:ggplot2':
## 
##     %+%
## The following object is masked from 'package:jsonlite':
## 
##     validate
## The following object is masked from 'package:dplyr':
## 
##     explain
## Loading required package: qdapTools
## Warning: package 'qdapTools' was built under R version 4.3.2
## 
## Attaching package: 'qdapTools'
## The following object is masked from 'package:dplyr':
## 
##     id
## Loading required package: RColorBrewer
## 
## Attaching package: 'qdap'
## The following objects are masked from 'package:base':
## 
##     Filter, proportions
library(tm)
## Warning: package 'tm' was built under R version 4.3.2
## Loading required package: NLP
## 
## Attaching package: 'NLP'
## The following object is masked from 'package:qdap':
## 
##     ngrams
## The following object is masked from 'package:ggplot2':
## 
##     annotate
## The following object is masked from 'package:httr':
## 
##     content
## 
## Attaching package: 'tm'
## The following objects are masked from 'package:qdap':
## 
##     as.DocumentTermMatrix, as.TermDocumentMatrix
library(qdapDictionaries)

data <-  data(package = "qdapDictionaries")

action_df <- as.data.frame(action.verbs) |> #Action Word List
  mutate(sentiment = "action") |>
  rename(word = action.verbs)

amplification_df <- as.data.frame(amplification.words) |> #Amplifying Words
  mutate(sentiment = "amplification") |>
  rename(word = amplification.words)

deamplification_df <- as.data.frame(deamplification.words) |> #De-amplifying Words
  mutate(sentiment = "deamplification") |>
  rename(word = deamplification.words)


negation_df <- as.data.frame(negation.words) |> #negation Words
  mutate(sentiment = "negation") |>
  rename(word = negation.words)

negative_df <- as.data.frame(negative.words) |> #negative Words
  mutate(sentiment = "negative") |>
  rename(word = negative.words)

positive_df <- as.data.frame(positive.words) |> #Positive Words
  mutate(sentiment = "positive") |>
  rename(word = positive.words)

power_df <- as.data.frame(power.words) |> #Words that Indicate Power
  mutate(sentiment = "power") |>
  rename(word = power.words)

strong_df <- as.data.frame(strong.words) |> #Words that Indicate Strength
  mutate(sentiment = "strong") |>
  rename(word = strong.words)

submit_df <- as.data.frame(submit.words) |> #Words that Indicate Submission
  mutate(sentiment = "submit") |>
  rename(word = submit.words)

weak_df <- as.data.frame(weak.words) |> #Words that Indicate Weakness
  mutate(sentiment = "weak") |>
  rename(word = weak.words)

qdap_lex <- bind_rows(action_df,
                         amplification_df, 
                         deamplification_df, 
                         negation_df, 
                         negative_df,
                         positive_df,
                         power_df,
                         strong_df,
                         submit_df,
                         weak_df)
qdap_lex
##                           word       sentiment
## 1                       abduct          action
## 2                        abide          action
## 3                      abolish          action
## 4                      abscond          action
## 5                        abuse          action
## 6                   accelerate          action
## 7                       accept          action
## 8                  accommodate          action
## 9                   accomplish          action
## 10                  accumulate          action
## 11                      accuse          action
## 12                     achieve          action
## 13                     acquire          action
## 14                         act          action
## 15                    activate          action
## 16                       adapt          action
## 17                         add          action
## 18                     address          action
## 19                      adjust          action
## 20                  administer          action
## 21                      admire          action
## 22                       admit          action
## 23                       adopt          action
## 24                     advance          action
## 25                   advertise          action
## 26                      advise          action
## 27                    advocate          action
## 28                      afford          action
## 29                       agree          action
## 30                         aid          action
## 31                        aide          action
## 32                         aim          action
## 33                       alert          action
## 34                      alight          action
## 35                       align          action
## 36                    allocate          action
## 37                       allow          action
## 38                       alter          action
## 39                       amend          action
## 40                       amuse          action
## 41                     analyze          action
## 42                    announce          action
## 43                       annoy          action
## 44                      answer          action
## 45                  anticipate          action
## 46                   apologize          action
## 47                      appear          action
## 48                     applaud          action
## 49                       apply          action
## 50                     appoint          action
## 51                    appraise          action
## 52                  appreciate          action
## 53                   apprehend          action
## 54                    approach          action
## 55                 appropriate          action
## 56                     approve          action
## 57                   arbitrate          action
## 58                       argue          action
## 59                       arise          action
## 60                     arrange          action
## 61                      arrest          action
## 62                      arrive          action
## 63                  articulate          action
## 64                   ascertain          action
## 65                         ask          action
## 66                     assault          action
## 67                    assemble          action
## 68                      assess          action
## 69                      assign          action
## 70                      assist          action
## 71                      assume          action
## 72                      assure          action
## 73                      attach          action
## 74                      attack          action
## 75                      attain          action
## 76                     attempt          action
## 77                      attend          action
## 78                     attract          action
## 79                       audit          action
## 80                     augment          action
## 81                      author          action
## 82                   authorize          action
## 83                    automate          action
## 84                       avert          action
## 85                       avoid          action
## 86                       awake          action
## 87                       award          action
## 88                        back          action
## 89                        bake          action
## 90                     balance          action
## 91                         ban          action
## 92                        bang          action
## 93                         bar          action
## 94                        bare          action
## 95                     bargain          action
## 96                         bat          action
## 97                       bathe          action
## 98                      battle          action
## 99                          be          action
## 100                       beam          action
## 101                       bear          action
## 102                       beat          action
## 103                     become          action
## 104                        beg          action
## 105                      begin          action
## 106                     behave          action
## 107                     behold          action
## 108                     belong          action
## 109                       bend          action
## 110                     berate          action
## 111                      beset          action
## 112                        bet          action
## 113                        bid          action
## 114                       bind          action
## 115                       bite          action
## 116                      blast          action
## 117                     bleach          action
## 118                      bleed          action
## 119                      bless          action
## 120                      blind          action
## 121                      blink          action
## 122                      block          action
## 123                       blot          action
## 124                       blow          action
## 125                      blush          action
## 126                      boast          action
## 127                       boil          action
## 128                    bolster          action
## 129                       bolt          action
## 130                       bomb          action
## 131                       book          action
## 132                      boost          action
## 133                       bore          action
## 134                     borrow          action
## 135                     bought          action
## 136                     bounce          action
## 137                        bow          action
## 138                        box          action
## 139                      brake          action
## 140                     branch          action
## 141                      break          action
## 142                    breathe          action
## 143                      breed          action
## 144                      brief          action
## 145                   brighten          action
## 146                      bring          action
## 147                  broadcast          action
## 148                    broaden          action
## 149                      broke          action
## 150                     bruise          action
## 151                      brush          action
## 152                     bubble          action
## 153                       buck          action
## 154                     budget          action
## 155                      build          action
## 156                      built          action
## 157                       bump          action
## 158                       burn          action
## 159                      burst          action
## 160                       bury          action
## 161                  bushwhack          action
## 162                       bust          action
## 163                        buy          action
## 164                       buzz          action
## 165                  calculate          action
## 166                  calibrate          action
## 167                       call          action
## 168                       camp          action
## 169                    canvass          action
## 170                    capture          action
## 171                       care          action
## 172                      carry          action
## 173                      carve          action
## 174                       cast          action
## 175                    catalog          action
## 176                  catalogue          action
## 177                      catch          action
## 178                 categorize          action
## 179                      cater          action
## 180                 centralize          action
## 181                      chair          action
## 182                  challenge          action
## 183                     change          action
## 184                     charge          action
## 185                      chart          action
## 186                      chase          action
## 187                      cheat          action
## 188                      check          action
## 189                      cheer          action
## 190                       chew          action
## 191                      choke          action
## 192                     choose          action
## 193                       chop          action
## 194                      claim          action
## 195                       clap          action
## 196                    clarify          action
## 197                      clash          action
## 198                   classify          action
## 199                      clean          action
## 200                      clear          action
## 201                      climb          action
## 202                      cling          action
## 203                       clip          action
## 204                      close          action
## 205                     clothe          action
## 206                     clutch          action
## 207                      coach          action
## 208                       code          action
## 209                       coil          action
## 210                collaborate          action
## 211                   collapse          action
## 212                     collar          action
## 213                    collate          action
## 214                    collect          action
## 215                    collide          action
## 216                      color          action
## 217                       comb          action
## 218                    combine          action
## 219                       come          action
## 220                    comfort          action
## 221                    command          action
## 222                 commandeer          action
## 223                   commence          action
## 224                communicate          action
## 225                    compare          action
## 226                    compete          action
## 227                    compile          action
## 228                   complain          action
## 229                   complete          action
## 230                    compose          action
## 231                    compute          action
## 232                   conceive          action
## 233                concentrate          action
## 234              conceptualize          action
## 235                    concern          action
## 236                 conciliate          action
## 237                   conclude          action
## 238                   condense          action
## 239                    conduct          action
## 240                     confer          action
## 241                    confess          action
## 242                    confirm          action
## 243                   confront          action
## 244                    confuse          action
## 245                    connect          action
## 246                   conserve          action
## 247                   consider          action
## 248                    consist          action
## 249                consolidate          action
## 250                  construct          action
## 251                    consult          action
## 252                    contact          action
## 253                    contain          action
## 254                   continue          action
## 255                   contract          action
## 256                 contribute          action
## 257                    control          action
## 258                    convert          action
## 259                     convey          action
## 260                   convince          action
## 261                  cooperate          action
## 262                  cooperate          action
## 263                 coordinate          action
## 264                       copy          action
## 265                    correct          action
## 266                  correlate          action
## 267                 correspond          action
## 268                       cost          action
## 269                      cough          action
## 270                    counsel          action
## 271                      count          action
## 272                      cover          action
## 273                      crack          action
## 274                       cram          action
## 275                      crash          action
## 276                      crawl          action
## 277                     create          action
## 278                      creep          action
## 279                    cripple          action
## 280                   critique          action
## 281                      cross          action
## 282                     crouch          action
## 283                      crush          action
## 284                        cry          action
## 285                  cultivate          action
## 286                       cure          action
## 287                       curl          action
## 288                      curve          action
## 289                  customize          action
## 290                        cut          action
## 291                      cycle          action
## 292                        dam          action
## 293                     damage          action
## 294                      dance          action
## 295                       dare          action
## 296                       dart          action
## 297                       dash          action
## 298                       deal          action
## 299                     debate          action
## 300                      debug          action
## 301                      decay          action
## 302                    deceive          action
## 303                     decide          action
## 304                       deck          action
## 305                   decorate          action
## 306                   decrease          action
## 307                   dedicate          action
## 308                     deduce          action
## 309                     deduct          action
## 310                     defend          action
## 311                      defer          action
## 312                     define          action
## 313                      delay          action
## 314                   delegate          action
## 315                    delight          action
## 316                  delineate          action
## 317                    deliver          action
## 318                demonstrate          action
## 319                     depend          action
## 320                     depict          action
## 321                 depreciate          action
## 322                     derive          action
## 323                    descend          action
## 324                   describe          action
## 325                     desert          action
## 326                    deserve          action
## 327                     design          action
## 328                    destroy          action
## 329                     detail          action
## 330                     detect          action
## 331                  determine          action
## 332                    develop          action
## 333                     devise          action
## 334                     devote          action
## 335                   diagnose          action
## 336                    diagram          action
## 337                    dictate          action
## 338              differentiate          action
## 339                        dig          action
## 340                     direct          action
## 341                   disagree          action
## 342                  disappear          action
## 343                 disapprove          action
## 344                     disarm          action
## 345                    discard          action
## 346                  discharge          action
## 347                   disclose          action
## 348                   discover          action
## 349               discriminate          action
## 350                    discuss          action
## 351                    dislike          action
## 352                   dispatch          action
## 353                   dispense          action
## 354                    display          action
## 355                   disprove          action
## 356                    dissect          action
## 357                disseminate          action
## 358                distinguish          action
## 359                 distribute          action
## 360                      ditch          action
## 361                       dive          action
## 362                  diversify          action
## 363                     divert          action
## 364                     divide          action
## 365                         do          action
## 366                   document          action
## 367                      dodge          action
## 368                   dominate          action
## 369                       dope          action
## 370                     double          action
## 371                      doubt          action
## 372                      douse          action
## 373                      draft          action
## 374                       drag          action
## 375                      drain          action
## 376                  dramatize          action
## 377                      drape          action
## 378                       draw          action
## 379                      dream          action
## 380                      dress          action
## 381                       drew          action
## 382                      drill          action
## 383                      drink          action
## 384                       drip          action
## 385                      drive          action
## 386                       drop          action
## 387                      drown          action
## 388                       drug          action
## 389                       drum          action
## 390                        dry          action
## 391                       duel          action
## 392                       dunk          action
## 393                       dust          action
## 394                      dwell          action
## 395                       earn          action
## 396                       ease          action
## 397                        eat          action
## 398                       edge          action
## 399                       edit          action
## 400                    educate          action
## 401                     effect          action
## 402                      eject          action
## 403                      elect          action
## 404                    elevate          action
## 405                     elicit          action
## 406                  eliminate          action
## 407                      elope          action
## 408                      elude          action
## 409                  embarrass          action
## 410                     emerge          action
## 411                  emphasize          action
## 412                     employ          action
## 413                      empty          action
## 414                     enable          action
## 415                      enact          action
## 416                  encourage          action
## 417                        end          action
## 418                     endure          action
## 419                    enforce          action
## 420                     engage          action
## 421                   engineer          action
## 422                    enhance          action
## 423                     enjoin          action
## 424                      enjoy          action
## 425                    enlarge          action
## 426                  enlighten          action
## 427                     enlist          action
## 428                     enrich          action
## 429                    ensnare          action
## 430                     ensure          action
## 431                      enter          action
## 432                  entertain          action
## 433                  enumerate          action
## 434                      equip          action
## 435                      erupt          action
## 436                     escape          action
## 437                  establish          action
## 438                   estimate          action
## 439                   evacuate          action
## 440                      evade          action
## 441                   evaluate          action
## 442                      evict          action
## 443                    examine          action
## 444                     exceed          action
## 445                   exchange          action
## 446                     excite          action
## 447                     excuse          action
## 448                    execute          action
## 449                   exercise          action
## 450                      exert          action
## 451                     exhale          action
## 452                    exhibit          action
## 453                      exist          action
## 454                       exit          action
## 455                     expand          action
## 456                     expect          action
## 457                   expedite          action
## 458                      expel          action
## 459                 experiment          action
## 460                    explain          action
## 461                    explode          action
## 462                    explore          action
## 463                     expose          action
## 464                    express          action
## 465                     extend          action
## 466                  extirpate          action
## 467                    extract          action
## 468                extrapolate          action
## 469                  extricate          action
## 470                  fabricate          action
## 471                       face          action
## 472                 facilitate          action
## 473                       fade          action
## 474                       fail          action
## 475                       fake          action
## 476                       fall          action
## 477                     falter          action
## 478                familiarize          action
## 479                        fan          action
## 480                      fancy          action
## 481                    fashion          action
## 482                       fast          action
## 483                     fasten          action
## 484                        fax          action
## 485                       fear          action
## 486                       feed          action
## 487                       feel          action
## 488                      fence          action
## 489                       fend          action
## 490                      fetch          action
## 491                      fight          action
## 492                       file          action
## 493                       fill          action
## 494                       film          action
## 495                     filter          action
## 496                   finalize          action
## 497                    finance          action
## 498                       find          action
## 499                  fine-tune          action
## 500                     finger          action
## 501                       fire          action
## 502                        fit          action
## 503                        fix          action
## 504                       flag          action
## 505                       flap          action
## 506                      flash          action
## 507                    flatten          action
## 508                     flaunt          action
## 509                       flay          action
## 510                       flee          action
## 511                      flick          action
## 512                     flinch          action
## 513                      fling          action
## 514                       flip          action
## 515                       flit          action
## 516                      float          action
## 517                       flog          action
## 518                      flood          action
## 519                   flounder          action
## 520                      flout          action
## 521                       flow          action
## 522                     flower          action
## 523                      flush          action
## 524                        fly          action
## 525                      focus          action
## 526                       fold          action
## 527                     follow          action
## 528                     fondle          action
## 529                       fool          action
## 530                     forbid          action
## 531                      force          action
## 532                   forecast          action
## 533                     forego          action
## 534                    foresee          action
## 535                   foretell          action
## 536                     forget          action
## 537                    forgive          action
## 538                       form          action
## 539                  formulate          action
## 540                  fornicate          action
## 541                    forsake          action
## 542                    fortify          action
## 543                    forward          action
## 544                     foster          action
## 545                      found          action
## 546                      frame          action
## 547                     freeze          action
## 548                   frighten          action
## 549                        fry          action
## 550                     fumble          action
## 551                       fund          action
## 552                    furnish          action
## 553                    further          action
## 554                       gain          action
## 555                     gallop          action
## 556                     gather          action
## 557                      gauge          action
## 558                       gaze          action
## 559                   generate          action
## 560                    gesture          action
## 561                        get          action
## 562                       give          action
## 563                       glow          action
## 564                       glue          action
## 565                       gnaw          action
## 566                         go          action
## 567                     gossip          action
## 568                      gouge          action
## 569                     govern          action
## 570                       grab          action
## 571                      grade          action
## 572                   graduate          action
## 573                      grant          action
## 574                    grapple          action
## 575                      grasp          action
## 576                      grate          action
## 577                     grease          action
## 578                      greet          action
## 579                       grin          action
## 580                      grind          action
## 581                       grip          action
## 582                      gripe          action
## 583                      groan          action
## 584                      grope          action
## 585                       grow          action
## 586                      growl          action
## 587                      grunt          action
## 588                  guarantee          action
## 589                      guard          action
## 590                      guess          action
## 591                      guide          action
## 592                     gyrate          action
## 593                       hack          action
## 594                       hail          action
## 595                     hammer          action
## 596                       hand          action
## 597                     handle          action
## 598                  handwrite          action
## 599                       hang          action
## 600                     happen          action
## 601                     harass          action
## 602                       harm          action
## 603                       hate          action
## 604                       haul          action
## 605                      haunt          action
## 606                       head          action
## 607                       heal          action
## 608                       heap          action
## 609                       hear          action
## 610                       heat          action
## 611                       help          action
## 612                   hesitate          action
## 613                       hide          action
## 614                  highlight          action
## 615                     hijack          action
## 616                       hire          action
## 617                        hit          action
## 618                      hitch          action
## 619                     hobble          action
## 620                      hoist          action
## 621                       hold          action
## 622                       hook          action
## 623                        hop          action
## 624                       hope          action
## 625                       host          action
## 626                      hover          action
## 627                        hug          action
## 628                        hum          action
## 629                       hunt          action
## 630                       hurl          action
## 631                      hurry          action
## 632                       hurt          action
## 633                     hurtle          action
## 634                hypothesize          action
## 635                   identify          action
## 636                     ignore          action
## 637                 illustrate          action
## 638                    imagine          action
## 639                    imitate          action
## 640                     impart          action
## 641                  implement          action
## 642                     import          action
## 643                    impress          action
## 644                    improve          action
## 645                  improvise          action
## 646                       inch          action
## 647                    include          action
## 648                incorporate          action
## 649                   increase          action
## 650                      index          action
## 651                     indict          action
## 652              individualize          action
## 653                     induce          action
## 654                    inflict          action
## 655                  influence          action
## 656                     inform          action
## 657                   initiate          action
## 658                     inject          action
## 659                     injure          action
## 660                      inlay          action
## 661                   innovate          action
## 662                      input          action
## 663                     insert          action
## 664                    inspect          action
## 665                    inspire          action
## 666                    install          action
## 667                  instigate          action
## 668                  institute          action
## 669                   instruct          action
## 670                     insure          action
## 671                  integrate          action
## 672                     intend          action
## 673                  intensify          action
## 674                   interact          action
## 675                interchange          action
## 676                   interest          action
## 677                  interface          action
## 678                  interfere          action
## 679                   interlay          action
## 680                  interpret          action
## 681                  interrupt          action
## 682                  intervene          action
## 683                  interview          action
## 684                  introduce          action
## 685                     invade          action
## 686                     invent          action
## 687                  inventory          action
## 688                investigate          action
## 689                     invite          action
## 690                    involve          action
## 691                   irritate          action
## 692                    isolate          action
## 693                       itch          action
## 694                        jab          action
## 695                       jail          action
## 696                        jam          action
## 697                        jar          action
## 698                       jeer          action
## 699                       jerk          action
## 700                      jimmy          action
## 701                     jingle          action
## 702                        jog          action
## 703                       join          action
## 704                       joke          action
## 705                       jolt          action
## 706                      judge          action
## 707                     juggle          action
## 708                       jump          action
## 709                    justify          action
## 710                       keel          action
## 711                       keep          action
## 712                       kept          action
## 713                     kibitz          action
## 714                       kick          action
## 715                     kidnap          action
## 716                       kill          action
## 717                       kiss          action
## 718                      kneel          action
## 719                      knife          action
## 720                       knit          action
## 721                      knock          action
## 722                       knot          action
## 723                       know          action
## 724                      label          action
## 725                       land          action
## 726                       lash          action
## 727                      laugh          action
## 728                     launch          action
## 729                        lay          action
## 730                       lead          action
## 731                       lead          action
## 732                       lean          action
## 733                       leap          action
## 734                      learn          action
## 735                      leave          action
## 736                    lecture          action
## 737                       left          action
## 738                       lend          action
## 739                        let          action
## 740                      level          action
## 741                    license          action
## 742                       lick          action
## 743                        lie          action
## 744                       lift          action
## 745                      light          action
## 746                    lighten          action
## 747                       limp          action
## 748                  liquidate          action
## 749                       list          action
## 750                     listen          action
## 751                   litigate          action
## 752                       live          action
## 753                       load          action
## 754                      lobby          action
## 755                   localize          action
## 756                     locate          action
## 757                       lock          action
## 758                        log          action
## 759                       long          action
## 760                       look          action
## 761                       lose          action
## 762                       love          action
## 763                      lunge          action
## 764                      lurch          action
## 765                       maim          action
## 766                   maintain          action
## 767                       make          action
## 768                        man          action
## 769                     manage          action
## 770                     mangle          action
## 771                 manipulate          action
## 772                manufacture          action
## 773                        map          action
## 774                      march          action
## 775                       mark          action
## 776                     market          action
## 777                      marry          action
## 778                    massage          action
## 779                     master          action
## 780                      match          action
## 781                       mate          action
## 782                     matter          action
## 783                       maul          action
## 784                   maximize          action
## 785                       mean          action
## 786                    measure          action
## 787                  mechanize          action
## 788                     meddle          action
## 789                    mediate          action
## 790                       meet          action
## 791                       melt          action
## 792                       melt          action
## 793                   memorize          action
## 794                       mend          action
## 795                     mentor          action
## 796                      merge          action
## 797                  methodize          action
## 798                       milk          action
## 799                      mimic          action
## 800                       mine          action
## 801                     mingle          action
## 802                   minimize          action
## 803                    mislead          action
## 804                       miss          action
## 805                   misspell          action
## 806                    mistake          action
## 807              misunderstand          action
## 808                        mix          action
## 809                       moan          action
## 810                   mobilize          action
## 811                       mock          action
## 812                      model          action
## 813                   moderate          action
## 814                  modernize          action
## 815                     modify          action
## 816                     molest          action
## 817                    monitor          action
## 818                       moor          action
## 819                   motivate          action
## 820                      mourn          action
## 821                       move          action
## 822                        mow          action
## 823                     muddle          action
## 824                        mug          action
## 825                   multiply          action
## 826                     mumble          action
## 827                     murder          action
## 828                     muster          action
## 829                   mutilate          action
## 830                        nab          action
## 831                        nag          action
## 832                       nail          action
## 833                       name          action
## 834                    narrate          action
## 835                   navigate          action
## 836                     needle          action
## 837                  negotiate          action
## 838                       nest          action
## 839                       nick          action
## 840                        nip          action
## 841                        nod          action
## 842                   nominate          action
## 843                  normalize          action
## 844                       note          action
## 845                     notice          action
## 846                     notify          action
## 847                     number          action
## 848                      nurse          action
## 849                    nurture          action
## 850                       obey          action
## 851                     object          action
## 852                    observe          action
## 853                     obtain          action
## 854                     occupy          action
## 855                      occur          action
## 856                     offend          action
## 857                      offer          action
## 858                  officiate          action
## 859                     offset          action
## 860                       open          action
## 861                    operate          action
## 862                orchestrate          action
## 863                      order          action
## 864                   organize          action
## 865                     orient          action
## 866                  orientate          action
## 867                  originate          action
## 868                    outline          action
## 869                   overcome          action
## 870                     overdo          action
## 871                   overdraw          action
## 872                   overflow          action
## 873                   overhaul          action
## 874                   overhear          action
## 875                    oversaw          action
## 876                    oversee          action
## 877                   overtake          action
## 878                  overthrow          action
## 879                        owe          action
## 880                        own          action
## 881                       pack          action
## 882                    package          action
## 883                     paddle          action
## 884                       page          action
## 885                      paint          action
## 886                     pander          action
## 887                      panic          action
## 888                  parachute          action
## 889                     parade          action
## 890                   paralyze          action
## 891                       park          action
## 892                      parry          action
## 893                       part          action
## 894                participate          action
## 895                      party          action
## 896                       pass          action
## 897                      paste          action
## 898                        pat          action
## 899                     patrol          action
## 900                      pause          action
## 901                        paw          action
## 902                        pay          action
## 903                       peck          action
## 904                      pedal          action
## 905                       peel          action
## 906                       peep          action
## 907                  penetrate          action
## 908                   perceive          action
## 909                    perfect          action
## 910                    perform          action
## 911                     permit          action
## 912                   persuade          action
## 913                      phone          action
## 914                 photograph          action
## 915                       pick          action
## 916                     picket          action
## 917                       pile          action
## 918                      pilot          action
## 919                        pin          action
## 920                      pinch          action
## 921                       pine          action
## 922                   pinpoint          action
## 923                    pioneer          action
## 924                     pirate          action
## 925                      pitch          action
## 926                    placate          action
## 927                      place          action
## 928                       plan          action
## 929                      plant          action
## 930                       play          action
## 931                      plead          action
## 932                     please          action
## 933                       plod          action
## 934                       plow          action
## 935                       plug          action
## 936                     plunge          action
## 937                     pocket          action
## 938                      point          action
## 939                       poke          action
## 940                     polish          action
## 941                        pop          action
## 942                       pore          action
## 943                       pose          action
## 944                    possess          action
## 945                       post          action
## 946                     pounce          action
## 947                       pour          action
## 948                       pout          action
## 949                   practice          action
## 950                     praise          action
## 951                       pray          action
## 952                     preach          action
## 953                    precede          action
## 954                    predict          action
## 955                      preen          action
## 956                     prefer          action
## 957                    prepare          action
## 958                  prescribe          action
## 959                    present          action
## 960                   preserve          action
## 961                     preset          action
## 962                    preside          action
## 963                      press          action
## 964                    pretend          action
## 965                    prevent          action
## 966                      prick          action
## 967                      primp          action
## 968                      print          action
## 969                 prioritize          action
## 970                      probe          action
## 971                    process          action
## 972                    procure          action
## 973                       prod          action
## 974                    produce          action
## 975                    profess          action
## 976                    program          action
## 977                   progress          action
## 978                    project          action
## 979                    promise          action
## 980                    promote          action
## 981                     prompt          action
## 982                  proofread          action
## 983                     propel          action
## 984                    propose          action
## 985                    protect          action
## 986                      prove          action
## 987                    provide          action
## 988                    provoke          action
## 989                        pry          action
## 990                  publicize          action
## 991                    publish          action
## 992                       pull          action
## 993                     pummel          action
## 994                       pump          action
## 995                      punch          action
## 996                   puncture          action
## 997                     punish          action
## 998                   purchase          action
## 999                     pursue          action
## 1000                      push          action
## 1001                       put          action
## 1002                   qualify          action
## 1003                  quantify          action
## 1004                  question          action
## 1005                     queue          action
## 1006                      quit          action
## 1007                     quote          action
## 1008                      race          action
## 1009                   radiate          action
## 1010                      raid          action
## 1011                      rain          action
## 1012                     raise          action
## 1013                     rally          action
## 1014                       ram          action
## 1015                       ran          action
## 1016                      rank          action
## 1017                   ransack          action
## 1018                      rape          action
## 1019                      rate          action
## 1020                    rattle          action
## 1021                    ravage          action
## 1022                      rave          action
## 1023                     reach          action
## 1024                      read          action
## 1025                   realign          action
## 1026                   realize          action
## 1027                    reason          action
## 1028                    recall          action
## 1029                   receive          action
## 1030                   recline          action
## 1031                 recognize          action
## 1032                 recommend          action
## 1033                 reconcile          action
## 1034               reconnoiter          action
## 1035                    record          action
## 1036                    recoup          action
## 1037                  recreate          action
## 1038                   recruit          action
## 1039                   rectify          action
## 1040                    redeem          action
## 1041                    reduce          action
## 1042                      reel          action
## 1043                     refer          action
## 1044                    refine          action
## 1045                   reflect          action
## 1046                    refuse          action
## 1047                    regain          action
## 1048                  register          action
## 1049                    regret          action
## 1050                  regulate          action
## 1051              rehabilitate          action
## 1052                     reign          action
## 1053                 reinforce          action
## 1054                    reject          action
## 1055                   rejoice          action
## 1056                    rejoin          action
## 1057                    relate          action
## 1058                     relax          action
## 1059                   release          action
## 1060                    relent          action
## 1061                      rely          action
## 1062                    remain          action
## 1063                  remember          action
## 1064                    remind          action
## 1065                   remodel          action
## 1066                    remove          action
## 1067                    render          action
## 1068                     renew          action
## 1069                reorganize          action
## 1070                    repair          action
## 1071                    repeat          action
## 1072                     repel          action
## 1073                   replace          action
## 1074                     reply          action
## 1075                    report          action
## 1076                 represent          action
## 1077                 reproduce          action
## 1078                   repulse          action
## 1079                   request          action
## 1080                    rescue          action
## 1081                  research          action
## 1082                   reserve          action
## 1083                    resign          action
## 1084                    resist          action
## 1085                   resolve          action
## 1086                   respond          action
## 1087                   restore          action
## 1088                  restrict          action
## 1089               restructure          action
## 1090                    retain          action
## 1091                 retaliate          action
## 1092                    retire          action
## 1093                   retreat          action
## 1094                  retrieve          action
## 1095                    return          action
## 1096                    revamp          action
## 1097                    reveal          action
## 1098                    review          action
## 1099                    revise          action
## 1100                revitalize          action
## 1101                     rhyme          action
## 1102                       rid          action
## 1103                      ride          action
## 1104                      ring          action
## 1105                     rinse          action
## 1106                       rip          action
## 1107                      rise          action
## 1108                      risk          action
## 1109                       rob          action
## 1110                      rock          action
## 1111                      roll          action
## 1112                       rot          action
## 1113                     route          action
## 1114                       rub          action
## 1115                      ruin          action
## 1116                      rule          action
## 1117                       run          action
## 1118                      rush          action
## 1119                      sack          action
## 1120                      sail          action
## 1121                    salute          action
## 1122                    sample          action
## 1123                       sap          action
## 1124                   satisfy          action
## 1125                      save          action
## 1126                       saw          action
## 1127                       say          action
## 1128                     scale          action
## 1129                   scamper          action
## 1130                      scan          action
## 1131                     scare          action
## 1132                   scatter          action
## 1133                  scavenge          action
## 1134                  schedule          action
## 1135                     scold          action
## 1136                     scoop          action
## 1137                     scoot          action
## 1138                    scorch          action
## 1139                     score          action
## 1140                     scour          action
## 1141                     scout          action
## 1142                    scrape          action
## 1143                   scratch          action
## 1144                    scrawl          action
## 1145                    scream          action
## 1146                    screen          action
## 1147                     screw          action
## 1148                  scribble          action
## 1149                    script          action
## 1150                     scrub          action
## 1151                    scruff          action
## 1152                scrutinize          action
## 1153                   scuffle          action
## 1154                    sculpt          action
## 1155                   scuttle          action
## 1156                      seal          action
## 1157                    search          action
## 1158                    secure          action
## 1159                    seduce          action
## 1160                       see          action
## 1161                      seek          action
## 1162                   segment          action
## 1163                     seize          action
## 1164                    select          action
## 1165                      sell          action
## 1166                      send          action
## 1167                     sense          action
## 1168                  separate          action
## 1169                     serve          action
## 1170                   service          action
## 1171                       set          action
## 1172                    settle          action
## 1173                     sever          action
## 1174                       sew          action
## 1175                     shade          action
## 1176                     shake          action
## 1177                  shanghai          action
## 1178                     shape          action
## 1179                     share          action
## 1180                   sharpen          action
## 1181                     shave          action
## 1182                     shear          action
## 1183                      shed          action
## 1184                     shell          action
## 1185                   shelter          action
## 1186                    shield          action
## 1187                     shift          action
## 1188                     shine          action
## 1189                    shiver          action
## 1190                     shock          action
## 1191                      shoe          action
## 1192                     shoot          action
## 1193                      shop          action
## 1194                   shorten          action
## 1195                     shout          action
## 1196                     shove          action
## 1197                    shovel          action
## 1198                      show          action
## 1199                    shrink          action
## 1200                     shrug          action
## 1201                      shun          action
## 1202                      shut          action
## 1203                  sidestep          action
## 1204                      sigh          action
## 1205                      sign          action
## 1206                    signal          action
## 1207                  simplify          action
## 1208                  simulate          action
## 1209                       sin          action
## 1210                      sing          action
## 1211                      sink          action
## 1212                       sip          action
## 1213                       sit          action
## 1214                      size          action
## 1215                    sketch          action
## 1216                       ski          action
## 1217                      skid          action
## 1218                      skim          action
## 1219                      skip          action
## 1220                     skirt          action
## 1221                   slacken          action
## 1222                      slam          action
## 1223                      slap          action
## 1224                     slash          action
## 1225                      slay          action
## 1226                     sleep          action
## 1227                     slide          action
## 1228                     sling          action
## 1229                     slink          action
## 1230                      slip          action
## 1231                      slit          action
## 1232                      slow          action
## 1233                      slug          action
## 1234                     smack          action
## 1235                     smash          action
## 1236                     smear          action
## 1237                     smell          action
## 1238                     smile          action
## 1239                     smite          action
## 1240                     smoke          action
## 1241                   smuggle          action
## 1242                      snap          action
## 1243                     snare          action
## 1244                     snarl          action
## 1245                    snatch          action
## 1246                     sneak          action
## 1247                    sneeze          action
## 1248                   snicker          action
## 1249                     sniff          action
## 1250                    snitch          action
## 1251                     snoop          action
## 1252                     snore          action
## 1253                      snow          action
## 1254                      snub          action
## 1255                     snuff          action
## 1256                   snuggle          action
## 1257                      soak          action
## 1258                      sock          action
## 1259                      soil          action
## 1260                      sold          action
## 1261                   solicit          action
## 1262                     solve          action
## 1263                    soothe          action
## 1264                  soothsay          action
## 1265                      sort          action
## 1266                     sound          action
## 1267                       sow          action
## 1268                     spare          action
## 1269                     spark          action
## 1270                   sparkle          action
## 1271                     speak          action
## 1272                     spear          action
## 1273                 spearhead          action
## 1274                specialize          action
## 1275                   specify          action
## 1276                     speed          action
## 1277                     spell          action
## 1278                     spend          action
## 1279                     spike          action
## 1280                     spill          action
## 1281                      spin          action
## 1282                      spit          action
## 1283                  splatter          action
## 1284                    splice          action
## 1285                     split          action
## 1286                     spoil          action
## 1287                     spoke          action
## 1288                      spot          action
## 1289                     spray          action
## 1290                    spread          action
## 1291                    spring          action
## 1292                    sprint          action
## 1293                    sprout          action
## 1294                     spurn          action
## 1295                       spy          action
## 1296                    squash          action
## 1297                    squeak          action
## 1298                    squeal          action
## 1299                   squeeze          action
## 1300                     stack          action
## 1301                     stage          action
## 1302                   stagger          action
## 1303                     stain          action
## 1304                     stamp          action
## 1305                     stand          action
## 1306               standardize          action
## 1307                     stare          action
## 1308                     start          action
## 1309                   startle          action
## 1310                      stay          action
## 1311                     steal          action
## 1312                     steer          action
## 1313                      step          action
## 1314                     stick          action
## 1315                   stiffen          action
## 1316                    stifle          action
## 1317                 stimulate          action
## 1318                     sting          action
## 1319                     stink          action
## 1320                      stir          action
## 1321                    stitch          action
## 1322                     stomp          action
## 1323                      stop          action
## 1324                     store          action
## 1325                straighten          action
## 1326                  strangle          action
## 1327                     strap          action
## 1328                strategize          action
## 1329                streamline          action
## 1330                strengthen          action
## 1331                   stretch          action
## 1332                    stride          action
## 1333                    strike          action
## 1334                    string          action
## 1335                     strip          action
## 1336                    strive          action
## 1337                    stroke          action
## 1338                    struck          action
## 1339                 structure          action
## 1340                      stub          action
## 1341                     study          action
## 1342                     stuff          action
## 1343                   stumble          action
## 1344                      stun          action
## 1345                    subdue          action
## 1346                    sublet          action
## 1347                  submerge          action
## 1348                    submit          action
## 1349              substantiate          action
## 1350                substitute          action
## 1351                  subtract          action
## 1352                   succeed          action
## 1353                      suck          action
## 1354                    suffer          action
## 1355                   suggest          action
## 1356                      suit          action
## 1357                 summarize          action
## 1358                    summon          action
## 1359                 supervise          action
## 1360                    supply          action
## 1361                   support          action
## 1362                   suppose          action
## 1363                   surpass          action
## 1364                  surprise          action
## 1365                 surrender          action
## 1366                  surround          action
## 1367                    survey          action
## 1368                   suspect          action
## 1369                   suspend          action
## 1370                   sustain          action
## 1371                   swagger          action
## 1372                   swallow          action
## 1373                      swap          action
## 1374                      sway          action
## 1375                     swear          action
## 1376                     sweat          action
## 1377                     sweep          action
## 1378                     swell          action
## 1379                    swerve          action
## 1380                      swim          action
## 1381                     swing          action
## 1382                     swipe          action
## 1383                    switch          action
## 1384                 symbolize          action
## 1385                synthesize          action
## 1386               systematize          action
## 1387                 systemize          action
## 1388                  tabulate          action
## 1389                    tackle          action
## 1390                      tail          action
## 1391                      take          action
## 1392                      talk          action
## 1393                      tame          action
## 1394                       tap          action
## 1395                    target          action
## 1396                     taste          action
## 1397                    taught          action
## 1398                     taunt          action
## 1399                     teach          action
## 1400                      tear          action
## 1401                     tease          action
## 1402                 telephone          action
## 1403                      tell          action
## 1404                     tempt          action
## 1405                      tend          action
## 1406                 terminate          action
## 1407                   terrify          action
## 1408                 terrorize          action
## 1409                      test          action
## 1410                     thank          action
## 1411                      thaw          action
## 1412                  theorize          action
## 1413                     think          action
## 1414                    thrash          action
## 1415                    thread          action
## 1416                  threaten          action
## 1417                    thrive          action
## 1418                     throw          action
## 1419                    thrust          action
## 1420                      tick          action
## 1421                    tickle          action
## 1422                       tie          action
## 1423                      tilt          action
## 1424                      time          action
## 1425                       tip          action
## 1426                      tire          action
## 1427                      toss          action
## 1428                     touch          action
## 1429                      tour          action
## 1430                      tout          action
## 1431                       tow          action
## 1432                     trace          action
## 1433                     track          action
## 1434                     trade          action
## 1435                     train          action
## 1436                transcribe          action
## 1437                  transfer          action
## 1438                 transform          action
## 1439                 translate          action
## 1440                  transmit          action
## 1441                 transport          action
## 1442                 transpose          action
## 1443                      trap          action
## 1444                    travel          action
## 1445                     tread          action
## 1446                     treat          action
## 1447                   tremble          action
## 1448                     trick          action
## 1449                      trip          action
## 1450                    triple          action
## 1451                      trot          action
## 1452                   trouble          action
## 1453              troubleshoot          action
## 1454               troubleshot          action
## 1455                   trounce          action
## 1456                     trust          action
## 1457                       try          action
## 1458                      tuck          action
## 1459                       tug          action
## 1460                    tumble          action
## 1461                      turn          action
## 1462                     tutor          action
## 1463                     twist          action
## 1464                      type          action
## 1465                   uncover          action
## 1466                   undergo          action
## 1467                understand          action
## 1468                 undertake          action
## 1469                 undertook          action
## 1470                      undo          action
## 1471                   undress          action
## 1472                  unfasten          action
## 1473                    unfold          action
## 1474                     unify          action
## 1475                     unite          action
## 1476                    unlock          action
## 1477                    unpack          action
## 1478                  untangle          action
## 1479                    untidy          action
## 1480                    unveil          action
## 1481                    unwind          action
## 1482                    update          action
## 1483                   upgrade          action
## 1484                    upheld          action
## 1485                    uphold          action
## 1486                     upset          action
## 1487                       use          action
## 1488                     usher          action
## 1489                   utilize          action
## 1490                    vacate          action
## 1491                  validate          action
## 1492                     value          action
## 1493                    vanish          action
## 1494                  vanquish          action
## 1495                     vault          action
## 1496                      vent          action
## 1497                 verbalize          action
## 1498                    verify          action
## 1499                       vex          action
## 1500                      view          action
## 1501                   violate          action
## 1502                     visit          action
## 1503                 visualize          action
## 1504                  vitalize          action
## 1505                 volunteer          action
## 1506                      wade          action
## 1507                      wail          action
## 1508                      wait          action
## 1509                      wake          action
## 1510                      walk          action
## 1511                    wander          action
## 1512                      want          action
## 1513                      ward          action
## 1514                      warm          action
## 1515                      warn          action
## 1516                      wash          action
## 1517                     waste          action
## 1518                     watch          action
## 1519                     water          action
## 1520                      wave          action
## 1521                      wear          action
## 1522                     weave          action
## 1523                       wed          action
## 1524                     wedge          action
## 1525                      weed          action
## 1526                      weep          action
## 1527                     weigh          action
## 1528                   welcome          action
## 1529                      wend          action
## 1530                       wet          action
## 1531                     whack          action
## 1532                     whine          action
## 1533                      whip          action
## 1534                     whirl          action
## 1535                   whisper          action
## 1536                   whistle          action
## 1537                     widen          action
## 1538                     wield          action
## 1539                    wiggle          action
## 1540                       win          action
## 1541                      wind          action
## 1542                      wink          action
## 1543                      wipe          action
## 1544                      wish          action
## 1545                  withdraw          action
## 1546                  withhold          action
## 1547                 withstand          action
## 1548                   witness          action
## 1549                    wobble          action
## 1550                    wonder          action
## 1551                      work          action
## 1552                     worry          action
## 1553                      wrap          action
## 1554                     wreck          action
## 1555                    wrench          action
## 1556                   wrestle          action
## 1557                   wriggle          action
## 1558                     wring          action
## 1559                     write          action
## 1560                     x-ray          action
## 1561                     xerox          action
## 1562                      yank          action
## 1563                      yawn          action
## 1564                      yell          action
## 1565                      yelp          action
## 1566                     yield          action
## 1567                       zap          action
## 1568                       zip          action
## 1569                      zoom          action
## 1570                     acute   amplification
## 1571                   acutely   amplification
## 1572                   certain   amplification
## 1573                 certainly   amplification
## 1574                  colossal   amplification
## 1575                colossally   amplification
## 1576                      deep   amplification
## 1577                    deeply   amplification
## 1578                  definite   amplification
## 1579                definitely   amplification
## 1580                  enormous   amplification
## 1581                enormously   amplification
## 1582                   extreme   amplification
## 1583                 extremely   amplification
## 1584                     great   amplification
## 1585                   greatly   amplification
## 1586                   heavily   amplification
## 1587                     heavy   amplification
## 1588                      high   amplification
## 1589                    highly   amplification
## 1590                      huge   amplification
## 1591                    hugely   amplification
## 1592                   immense   amplification
## 1593                 immensely   amplification
## 1594              incalculable   amplification
## 1595              incalculably   amplification
## 1596                   massive   amplification
## 1597                 massively   amplification
## 1598                      more   amplification
## 1599                particular   amplification
## 1600              particularly   amplification
## 1601                   purpose   amplification
## 1602                 purposely   amplification
## 1603                     quite   amplification
## 1604                      real   amplification
## 1605                    really   amplification
## 1606                   serious   amplification
## 1607                 seriously   amplification
## 1608                    severe   amplification
## 1609                  severely   amplification
## 1610               significant   amplification
## 1611             significantly   amplification
## 1612                      sure   amplification
## 1613                    surely   amplification
## 1614                      true   amplification
## 1615                     truly   amplification
## 1616                      vast   amplification
## 1617                    vastly   amplification
## 1618                      very   amplification
## 1619                    barely deamplification
## 1620                   faintly deamplification
## 1621                       few deamplification
## 1622                    hardly deamplification
## 1623                    little deamplification
## 1624                      only deamplification
## 1625                    rarely deamplification
## 1626                    seldom deamplification
## 1627                  slightly deamplification
## 1628                  sparsely deamplification
## 1629              sporadically deamplification
## 1630                  very few deamplification
## 1631               very little deamplification
## 1632                     ain't        negation
## 1633                    aren't        negation
## 1634                     can't        negation
## 1635                  couldn't        negation
## 1636                    didn't        negation
## 1637                   doesn't        negation
## 1638                     don't        negation
## 1639                    hasn't        negation
## 1640                     isn't        negation
## 1641                  mightn't        negation
## 1642                   mustn't        negation
## 1643                   neither        negation
## 1644                     never        negation
## 1645                        no        negation
## 1646                    nobody        negation
## 1647                       nor        negation
## 1648                       not        negation
## 1649                    shan't        negation
## 1650                 shouldn't        negation
## 1651                    wasn't        negation
## 1652                   weren't        negation
## 1653                     won't        negation
## 1654                  wouldn't        negation
## 1655                  abnormal        negative
## 1656                   abolish        negative
## 1657                abominable        negative
## 1658                abominably        negative
## 1659                 abominate        negative
## 1660               abomination        negative
## 1661                     abort        negative
## 1662                   aborted        negative
## 1663                    aborts        negative
## 1664                    abrade        negative
## 1665                  abrasive        negative
## 1666                    abrupt        negative
## 1667                  abruptly        negative
## 1668                   abscond        negative
## 1669                   absence        negative
## 1670             absent minded        negative
## 1671                  absentee        negative
## 1672                    absurd        negative
## 1673                 absurdity        negative
## 1674                  absurdly        negative
## 1675                absurdness        negative
## 1676                     abuse        negative
## 1677                    abused        negative
## 1678                    abuses        negative
## 1679                   abusive        negative
## 1680                   abysmal        negative
## 1681                 abysmally        negative
## 1682                     abyss        negative
## 1683                accidental        negative
## 1684                    accost        negative
## 1685                  accursed        negative
## 1686                accusation        negative
## 1687               accusations        negative
## 1688                    accuse        negative
## 1689                   accuses        negative
## 1690                  accusing        negative
## 1691                accusingly        negative
## 1692                  acerbate        negative
## 1693                   acerbic        negative
## 1694               acerbically        negative
## 1695                      ache        negative
## 1696                     ached        negative
## 1697                     aches        negative
## 1698                     achey        negative
## 1699                    aching        negative
## 1700                     acrid        negative
## 1701                   acridly        negative
## 1702                 acridness        negative
## 1703               acrimonious        negative
## 1704             acrimoniously        negative
## 1705                  acrimony        negative
## 1706                   adamant        negative
## 1707                 adamantly        negative
## 1708                    addict        negative
## 1709                  addicted        negative
## 1710                 addicting        negative
## 1711                   addicts        negative
## 1712                  admonish        negative
## 1713                admonisher        negative
## 1714             admonishingly        negative
## 1715              admonishment        negative
## 1716                admonition        negative
## 1717                adulterate        negative
## 1718               adulterated        negative
## 1719              adulteration        negative
## 1720                adulterier        negative
## 1721               adversarial        negative
## 1722                 adversary        negative
## 1723                   adverse        negative
## 1724                 adversity        negative
## 1725                   afflict        negative
## 1726                affliction        negative
## 1727                afflictive        negative
## 1728                   affront        negative
## 1729                    afraid        negative
## 1730                 aggravate        negative
## 1731               aggravating        negative
## 1732               aggravation        negative
## 1733                aggression        negative
## 1734                aggressive        negative
## 1735            aggressiveness        negative
## 1736                 aggressor        negative
## 1737                  aggrieve        negative
## 1738                 aggrieved        negative
## 1739               aggrivation        negative
## 1740                    aghast        negative
## 1741                   agonies        negative
## 1742                   agonize        negative
## 1743                 agonizing        negative
## 1744               agonizingly        negative
## 1745                     agony        negative
## 1746                   aground        negative
## 1747                       ail        negative
## 1748                    ailing        negative
## 1749                   ailment        negative
## 1750                   aimless        negative
## 1751                     alarm        negative
## 1752                   alarmed        negative
## 1753                  alarming        negative
## 1754                alarmingly        negative
## 1755                  alienate        negative
## 1756                 alienated        negative
## 1757                alienation        negative
## 1758                allegation        negative
## 1759               allegations        negative
## 1760                    allege        negative
## 1761                  allergic        negative
## 1762                 allergies        negative
## 1763                   allergy        negative
## 1764                     aloof        negative
## 1765               altercation        negative
## 1766                 ambiguity        negative
## 1767                 ambiguous        negative
## 1768               ambivalence        negative
## 1769                ambivalent        negative
## 1770                    ambush        negative
## 1771                     amiss        negative
## 1772                  amputate        negative
## 1773                 anarchism        negative
## 1774                 anarchist        negative
## 1775               anarchistic        negative
## 1776                   anarchy        negative
## 1777                    anemic        negative
## 1778                     anger        negative
## 1779                   angrily        negative
## 1780                 angriness        negative
## 1781                     angry        negative
## 1782                   anguish        negative
## 1783                 animosity        negative
## 1784                annihilate        negative
## 1785              annihilation        negative
## 1786                     annoy        negative
## 1787                 annoyance        negative
## 1788                annoyances        negative
## 1789                   annoyed        negative
## 1790                  annoying        negative
## 1791                annoyingly        negative
## 1792                    annoys        negative
## 1793                 anomalous        negative
## 1794                   anomaly        negative
## 1795                antagonism        negative
## 1796                antagonist        negative
## 1797              antagonistic        negative
## 1798                antagonize        negative
## 1799                      anti        negative
## 1800             anti american        negative
## 1801              anti israeli        negative
## 1802           anti occupation        negative
## 1803        anti proliferation        negative
## 1804              anti semites        negative
## 1805               anti social        negative
## 1806                   anti us        negative
## 1807                anti white        negative
## 1808                 antipathy        negative
## 1809                antiquated        negative
## 1810              antithetical        negative
## 1811                 anxieties        negative
## 1812                   anxiety        negative
## 1813                   anxious        negative
## 1814                 anxiously        negative
## 1815               anxiousness        negative
## 1816                 apathetic        negative
## 1817             apathetically        negative
## 1818                    apathy        negative
## 1819                apocalypse        negative
## 1820               apocalyptic        negative
## 1821                 apologist        negative
## 1822                apologists        negative
## 1823                     appal        negative
## 1824                    appall        negative
## 1825                  appalled        negative
## 1826                 appalling        negative
## 1827               appallingly        negative
## 1828              apprehension        negative
## 1829             apprehensions        negative
## 1830              apprehensive        negative
## 1831            apprehensively        negative
## 1832                 arbitrary        negative
## 1833                    arcane        negative
## 1834                   archaic        negative
## 1835                   arduous        negative
## 1836                 arduously        negative
## 1837             argumentative        negative
## 1838                 arrogance        negative
## 1839                  arrogant        negative
## 1840                arrogantly        negative
## 1841                   ashamed        negative
## 1842                   asinine        negative
## 1843                 asininely        negative
## 1844               asinininity        negative
## 1845                   askance        negative
## 1846                   asperse        negative
## 1847                 aspersion        negative
## 1848                aspersions        negative
## 1849                    assail        negative
## 1850                  assassin        negative
## 1851               assassinate        negative
## 1852                   assault        negative
## 1853                    assult        negative
## 1854                    astray        negative
## 1855                   asunder        negative
## 1856                 atrocious        negative
## 1857                atrocities        negative
## 1858                  atrocity        negative
## 1859                   atrophy        negative
## 1860                    attack        negative
## 1861                   attacks        negative
## 1862                 audacious        negative
## 1863               audaciously        negative
## 1864             audaciousness        negative
## 1865                  audacity        negative
## 1866               audiciously        negative
## 1867                   austere        negative
## 1868             authoritarian        negative
## 1869                  autocrat        negative
## 1870                autocratic        negative
## 1871                 avalanche        negative
## 1872                   avarice        negative
## 1873                avaricious        negative
## 1874              avariciously        negative
## 1875                    avenge        negative
## 1876                    averse        negative
## 1877                  aversion        negative
## 1878                    aweful        negative
## 1879                     awful        negative
## 1880                   awfully        negative
## 1881                 awfulness        negative
## 1882                   awkward        negative
## 1883               awkwardness        negative
## 1884                        ax        negative
## 1885                    babble        negative
## 1886               back logged        negative
## 1887                 back wood        negative
## 1888                back woods        negative
## 1889                  backache        negative
## 1890                 backaches        negative
## 1891                backaching        negative
## 1892                  backbite        negative
## 1893                backbiting        negative
## 1894                  backward        negative
## 1895              backwardness        negative
## 1896                  backwood        negative
## 1897                 backwoods        negative
## 1898                       bad        negative
## 1899                     badly        negative
## 1900                    baffle        negative
## 1901                   baffled        negative
## 1902                bafflement        negative
## 1903                  baffling        negative
## 1904                      bait        negative
## 1905                      balk        negative
## 1906                     banal        negative
## 1907                  banalize        negative
## 1908                      bane        negative
## 1909                    banish        negative
## 1910                banishment        negative
## 1911                  bankrupt        negative
## 1912                 barbarian        negative
## 1913                  barbaric        negative
## 1914              barbarically        negative
## 1915                 barbarity        negative
## 1916                 barbarous        negative
## 1917               barbarously        negative
## 1918                    barren        negative
## 1919                  baseless        negative
## 1920                      bash        negative
## 1921                    bashed        negative
## 1922                   bashful        negative
## 1923                   bashing        negative
## 1924                   bastard        negative
## 1925                  bastards        negative
## 1926                  battered        negative
## 1927                 battering        negative
## 1928                     batty        negative
## 1929                   bearish        negative
## 1930                   beastly        negative
## 1931                    bedlam        negative
## 1932                 bedlamite        negative
## 1933                    befoul        negative
## 1934                       beg        negative
## 1935                    beggar        negative
## 1936                  beggarly        negative
## 1937                   begging        negative
## 1938                   beguile        negative
## 1939                   belabor        negative
## 1940                   belated        negative
## 1941                 beleaguer        negative
## 1942                     belie        negative
## 1943                  belittle        negative
## 1944                 belittled        negative
## 1945                belittling        negative
## 1946                 bellicose        negative
## 1947              belligerence        negative
## 1948               belligerent        negative
## 1949             belligerently        negative
## 1950                    bemoan        negative
## 1951                 bemoaning        negative
## 1952                   bemused        negative
## 1953                      bent        negative
## 1954                    berate        negative
## 1955                   bereave        negative
## 1956               bereavement        negative
## 1957                    bereft        negative
## 1958                   berserk        negative
## 1959                   beseech        negative
## 1960                     beset        negative
## 1961                   besiege        negative
## 1962                  besmirch        negative
## 1963                   bestial        negative
## 1964                    betray        negative
## 1965                  betrayal        negative
## 1966                 betrayals        negative
## 1967                  betrayer        negative
## 1968                 betraying        negative
## 1969                   betrays        negative
## 1970                    bewail        negative
## 1971                    beware        negative
## 1972                  bewilder        negative
## 1973                bewildered        negative
## 1974               bewildering        negative
## 1975             bewilderingly        negative
## 1976              bewilderment        negative
## 1977                   bewitch        negative
## 1978                      bias        negative
## 1979                    biased        negative
## 1980                    biases        negative
## 1981                    bicker        negative
## 1982                 bickering        negative
## 1983               bid rigging        negative
## 1984                 bigotries        negative
## 1985                   bigotry        negative
## 1986                     bitch        negative
## 1987                    bitchy        negative
## 1988                    biting        negative
## 1989                  bitingly        negative
## 1990                    bitter        negative
## 1991                  bitterly        negative
## 1992                bitterness        negative
## 1993                   bizarre        negative
## 1994                      blab        negative
## 1995                   blabber        negative
## 1996                 blackmail        negative
## 1997                      blah        negative
## 1998                     blame        negative
## 1999               blameworthy        negative
## 2000                     bland        negative
## 2001                  blandish        negative
## 2002                 blaspheme        negative
## 2003               blasphemous        negative
## 2004                 blasphemy        negative
## 2005                   blasted        negative
## 2006                   blatant        negative
## 2007                 blatantly        negative
## 2008                   blather        negative
## 2009                     bleak        negative
## 2010                   bleakly        negative
## 2011                 bleakness        negative
## 2012                     bleed        negative
## 2013                  bleeding        negative
## 2014                    bleeds        negative
## 2015                   blemish        negative
## 2016                     blind        negative
## 2017                  blinding        negative
## 2018                blindingly        negative
## 2019                 blindside        negative
## 2020                   blister        negative
## 2021                blistering        negative
## 2022                   bloated        negative
## 2023                  blockage        negative
## 2024                 blockhead        negative
## 2025                 bloodshed        negative
## 2026              bloodthirsty        negative
## 2027                    bloody        negative
## 2028                   blotchy        negative
## 2029                      blow        negative
## 2030                   blunder        negative
## 2031                blundering        negative
## 2032                  blunders        negative
## 2033                     blunt        negative
## 2034                      blur        negative
## 2035                   bluring        negative
## 2036                   blurred        negative
## 2037                  blurring        negative
## 2038                    blurry        negative
## 2039                     blurs        negative
## 2040                     blurt        negative
## 2041                  boastful        negative
## 2042                    boggle        negative
## 2043                     bogus        negative
## 2044                      boil        negative
## 2045                   boiling        negative
## 2046                boisterous        negative
## 2047                      bomb        negative
## 2048                   bombard        negative
## 2049               bombardment        negative
## 2050                 bombastic        negative
## 2051                   bondage        negative
## 2052                   bonkers        negative
## 2053                      bore        negative
## 2054                     bored        negative
## 2055                   boredom        negative
## 2056                     bores        negative
## 2057                    boring        negative
## 2058                     botch        negative
## 2059                    bother        negative
## 2060                  bothered        negative
## 2061                 bothering        negative
## 2062                   bothers        negative
## 2063                bothersome        negative
## 2064                bowdlerize        negative
## 2065                   boycott        negative
## 2066                  braggart        negative
## 2067                   bragger        negative
## 2068                 brainless        negative
## 2069                 brainwash        negative
## 2070                     brash        negative
## 2071                   brashly        negative
## 2072                 brashness        negative
## 2073                      brat        negative
## 2074                   bravado        negative
## 2075                    brazen        negative
## 2076                  brazenly        negative
## 2077                brazenness        negative
## 2078                    breach        negative
## 2079                     break        negative
## 2080                  break up        negative
## 2081                 break ups        negative
## 2082                 breakdown        negative
## 2083                  breaking        negative
## 2084                    breaks        negative
## 2085                   breakup        negative
## 2086                  breakups        negative
## 2087                   bribery        negative
## 2088                 brimstone        negative
## 2089                   bristle        negative
## 2090                   brittle        negative
## 2091                     broke        negative
## 2092                    broken        negative
## 2093            broken hearted        negative
## 2094                     brood        negative
## 2095                  browbeat        negative
## 2096                    bruise        negative
## 2097                   bruised        negative
## 2098                   bruises        negative
## 2099                  bruising        negative
## 2100                   brusque        negative
## 2101                    brutal        negative
## 2102               brutalising        negative
## 2103               brutalities        negative
## 2104                 brutality        negative
## 2105                 brutalize        negative
## 2106               brutalizing        negative
## 2107                  brutally        negative
## 2108                     brute        negative
## 2109                   brutish        negative
## 2110                        bs        negative
## 2111                    buckle        negative
## 2112                       bug        negative
## 2113                   bugging        negative
## 2114                     buggy        negative
## 2115                      bugs        negative
## 2116                   bulkier        negative
## 2117                 bulkiness        negative
## 2118                     bulky        negative
## 2119                 bulkyness        negative
## 2120                      bull        negative
## 2121                   bullies        negative
## 2122                  bullshit        negative
## 2123                  bullshyt        negative
## 2124                     bully        negative
## 2125                  bullying        negative
## 2126                bullyingly        negative
## 2127                       bum        negative
## 2128                      bump        negative
## 2129                    bumped        negative
## 2130                   bumping        negative
## 2131                  bumpping        negative
## 2132                     bumps        negative
## 2133                     bumpy        negative
## 2134                    bungle        negative
## 2135                   bungler        negative
## 2136                  bungling        negative
## 2137                      bunk        negative
## 2138                    burden        negative
## 2139                burdensome        negative
## 2140              burdensomely        negative
## 2141                      burn        negative
## 2142                    burned        negative
## 2143                   burning        negative
## 2144                     burns        negative
## 2145                      bust        negative
## 2146                     busts        negative
## 2147                  busybody        negative
## 2148                   butcher        negative
## 2149                  butchery        negative
## 2150                   buzzing        negative
## 2151                 byzantine        negative
## 2152                    cackle        negative
## 2153                calamities        negative
## 2154                calamitous        negative
## 2155              calamitously        negative
## 2156                  calamity        negative
## 2157                   callous        negative
## 2158                calumniate        negative
## 2159              calumniation        negative
## 2160                 calumnies        negative
## 2161                calumnious        negative
## 2162              calumniously        negative
## 2163                   calumny        negative
## 2164                    cancer        negative
## 2165                 cancerous        negative
## 2166                  cannibal        negative
## 2167               cannibalize        negative
## 2168                capitulate        negative
## 2169                capricious        negative
## 2170              capriciously        negative
## 2171            capriciousness        negative
## 2172                   capsize        negative
## 2173                  careless        negative
## 2174              carelessness        negative
## 2175                caricature        negative
## 2176                   carnage        negative
## 2177                      carp        negative
## 2178                cartoonish        negative
## 2179             cash strapped        negative
## 2180                 castigate        negative
## 2181                 castrated        negative
## 2182                  casualty        negative
## 2183                 cataclysm        negative
## 2184               cataclysmal        negative
## 2185               cataclysmic        negative
## 2186           cataclysmically        negative
## 2187               catastrophe        negative
## 2188              catastrophes        negative
## 2189              catastrophic        negative
## 2190          catastrophically        negative
## 2191             catastrophies        negative
## 2192                   caustic        negative
## 2193               caustically        negative
## 2194                cautionary        negative
## 2195                      cave        negative
## 2196                   censure        negative
## 2197                     chafe        negative
## 2198                     chaff        negative
## 2199                   chagrin        negative
## 2200               challenging        negative
## 2201                     chaos        negative
## 2202                   chaotic        negative
## 2203                   chasten        negative
## 2204                  chastise        negative
## 2205              chastisement        negative
## 2206                   chatter        negative
## 2207                chatterbox        negative
## 2208                     cheap        negative
## 2209                   cheapen        negative
## 2210                   cheaply        negative
## 2211                     cheat        negative
## 2212                   cheated        negative
## 2213                   cheater        negative
## 2214                  cheating        negative
## 2215                    cheats        negative
## 2216                 checkered        negative
## 2217                 cheerless        negative
## 2218                    cheesy        negative
## 2219                     chide        negative
## 2220                  childish        negative
## 2221                     chill        negative
## 2222                    chilly        negative
## 2223                   chintzy        negative
## 2224                     choke        negative
## 2225                  choleric        negative
## 2226                    choppy        negative
## 2227                     chore        negative
## 2228                   chronic        negative
## 2229                    chunky        negative
## 2230                    clamor        negative
## 2231                 clamorous        negative
## 2232                     clash        negative
## 2233                    cliche        negative
## 2234                   cliched        negative
## 2235                    clique        negative
## 2236                      clog        negative
## 2237                   clogged        negative
## 2238                     clogs        negative
## 2239                     cloud        negative
## 2240                  clouding        negative
## 2241                    cloudy        negative
## 2242                  clueless        negative
## 2243                    clumsy        negative
## 2244                    clunky        negative
## 2245                    coarse        negative
## 2246                     cocky        negative
## 2247                    coerce        negative
## 2248                  coercion        negative
## 2249                  coercive        negative
## 2250                      cold        negative
## 2251                    coldly        negative
## 2252                  collapse        negative
## 2253                   collude        negative
## 2254                 collusion        negative
## 2255                 combative        negative
## 2256                   combust        negative
## 2257                   comical        negative
## 2258               commiserate        negative
## 2259               commonplace        negative
## 2260                 commotion        negative
## 2261                commotions        negative
## 2262                complacent        negative
## 2263                  complain        negative
## 2264                complained        negative
## 2265               complaining        negative
## 2266                 complains        negative
## 2267                 complaint        negative
## 2268                complaints        negative
## 2269                   complex        negative
## 2270               complicated        negative
## 2271              complication        negative
## 2272                 complicit        negative
## 2273                compulsion        negative
## 2274                compulsive        negative
## 2275                   concede        negative
## 2276                  conceded        negative
## 2277                   conceit        negative
## 2278                 conceited        negative
## 2279                    concen        negative
## 2280                   concens        negative
## 2281                   concern        negative
## 2282                 concerned        negative
## 2283                  concerns        negative
## 2284                concession        negative
## 2285               concessions        negative
## 2286                   condemn        negative
## 2287               condemnable        negative
## 2288              condemnation        negative
## 2289                 condemned        negative
## 2290                  condemns        negative
## 2291                condescend        negative
## 2292             condescending        negative
## 2293           condescendingly        negative
## 2294             condescension        negative
## 2295                   confess        negative
## 2296                confession        negative
## 2297               confessions        negative
## 2298                  confined        negative
## 2299                  conflict        negative
## 2300                conflicted        negative
## 2301               conflicting        negative
## 2302                 conflicts        negative
## 2303                  confound        negative
## 2304                confounded        negative
## 2305               confounding        negative
## 2306                  confront        negative
## 2307             confrontation        negative
## 2308           confrontational        negative
## 2309                   confuse        negative
## 2310                  confused        negative
## 2311                  confuses        negative
## 2312                 confusing        negative
## 2313                 confusion        negative
## 2314                confusions        negative
## 2315                 congested        negative
## 2316                congestion        negative
## 2317                      cons        negative
## 2318                  conscons        negative
## 2319              conservative        negative
## 2320               conspicuous        negative
## 2321             conspicuously        negative
## 2322              conspiracies        negative
## 2323                conspiracy        negative
## 2324               conspirator        negative
## 2325            conspiratorial        negative
## 2326                  conspire        negative
## 2327             consternation        negative
## 2328                contagious        negative
## 2329               contaminate        negative
## 2330              contaminated        negative
## 2331              contaminates        negative
## 2332             contaminating        negative
## 2333             contamination        negative
## 2334                  contempt        negative
## 2335              contemptible        negative
## 2336              contemptuous        negative
## 2337            contemptuously        negative
## 2338                   contend        negative
## 2339                contention        negative
## 2340               contentious        negative
## 2341                   contort        negative
## 2342               contortions        negative
## 2343                contradict        negative
## 2344             contradiction        negative
## 2345             contradictory        negative
## 2346              contrariness        negative
## 2347                contravene        negative
## 2348                  contrive        negative
## 2349                 contrived        negative
## 2350             controversial        negative
## 2351               controversy        negative
## 2352                convoluted        negative
## 2353                   corrode        negative
## 2354                 corrosion        negative
## 2355                corrosions        negative
## 2356                 corrosive        negative
## 2357                   corrupt        negative
## 2358                 corrupted        negative
## 2359                corrupting        negative
## 2360                corruption        negative
## 2361                  corrupts        negative
## 2362                corruptted        negative
## 2363                  costlier        negative
## 2364                    costly        negative
## 2365        counter productive        negative
## 2366         counterproductive        negative
## 2367                  coupists        negative
## 2368                  covetous        negative
## 2369                    coward        negative
## 2370                  cowardly        negative
## 2371                    crabby        negative
## 2372                     crack        negative
## 2373                   cracked        negative
## 2374                    cracks        negative
## 2375                  craftily        negative
## 2376                   craftly        negative
## 2377                    crafty        negative
## 2378                     cramp        negative
## 2379                   cramped        negative
## 2380                  cramping        negative
## 2381                    cranky        negative
## 2382                      crap        negative
## 2383                    crappy        negative
## 2384                     craps        negative
## 2385                     crash        negative
## 2386                   crashed        negative
## 2387                   crashes        negative
## 2388                  crashing        negative
## 2389                     crass        negative
## 2390                    craven        negative
## 2391                  cravenly        negative
## 2392                     craze        negative
## 2393                   crazily        negative
## 2394                 craziness        negative
## 2395                     crazy        negative
## 2396                     creak        negative
## 2397                  creaking        negative
## 2398                    creaks        negative
## 2399                 credulous        negative
## 2400                     creep        negative
## 2401                  creeping        negative
## 2402                    creeps        negative
## 2403                    creepy        negative
## 2404                     crept        negative
## 2405                     crime        negative
## 2406                  criminal        negative
## 2407                    cringe        negative
## 2408                   cringed        negative
## 2409                   cringes        negative
## 2410                   cripple        negative
## 2411                  crippled        negative
## 2412                  cripples        negative
## 2413                 crippling        negative
## 2414                    crisis        negative
## 2415                    critic        negative
## 2416                  critical        negative
## 2417                 criticism        negative
## 2418                criticisms        negative
## 2419                 criticize        negative
## 2420                criticized        negative
## 2421               criticizing        negative
## 2422                   critics        negative
## 2423                  cronyism        negative
## 2424                     crook        negative
## 2425                   crooked        negative
## 2426                    crooks        negative
## 2427                   crowded        negative
## 2428               crowdedness        negative
## 2429                     crude        negative
## 2430                     cruel        negative
## 2431                   crueler        negative
## 2432                  cruelest        negative
## 2433                   cruelly        negative
## 2434                 cruelness        negative
## 2435                 cruelties        negative
## 2436                   cruelty        negative
## 2437                   crumble        negative
## 2438                 crumbling        negative
## 2439                    crummy        negative
## 2440                   crumple        negative
## 2441                  crumpled        negative
## 2442                  crumples        negative
## 2443                     crush        negative
## 2444                   crushed        negative
## 2445                  crushing        negative
## 2446                       cry        negative
## 2447                  culpable        negative
## 2448                   culprit        negative
## 2449                cumbersome        negative
## 2450                      cunt        negative
## 2451                     cunts        negative
## 2452                   cuplrit        negative
## 2453                     curse        negative
## 2454                    cursed        negative
## 2455                    curses        negative
## 2456                      curt        negative
## 2457                      cuss        negative
## 2458                    cussed        negative
## 2459                 cutthroat        negative
## 2460                   cynical        negative
## 2461                  cynicism        negative
## 2462                    damage        negative
## 2463                   damaged        negative
## 2464                   damages        negative
## 2465                  damaging        negative
## 2466                      damn        negative
## 2467                  damnable        negative
## 2468                  damnably        negative
## 2469                 damnation        negative
## 2470                    damned        negative
## 2471                   damning        negative
## 2472                    damper        negative
## 2473                    danger        negative
## 2474                 dangerous        negative
## 2475             dangerousness        negative
## 2476                      dark        negative
## 2477                    darken        negative
## 2478                  darkened        negative
## 2479                    darker        negative
## 2480                  darkness        negative
## 2481                   dastard        negative
## 2482                 dastardly        negative
## 2483                     daunt        negative
## 2484                  daunting        negative
## 2485                dauntingly        negative
## 2486                    dawdle        negative
## 2487                      daze        negative
## 2488                     dazed        negative
## 2489                      dead        negative
## 2490                  deadbeat        negative
## 2491                  deadlock        negative
## 2492                    deadly        negative
## 2493                deadweight        negative
## 2494                      deaf        negative
## 2495                    dearth        negative
## 2496                     death        negative
## 2497                   debacle        negative
## 2498                    debase        negative
## 2499                debasement        negative
## 2500                   debaser        negative
## 2501                 debatable        negative
## 2502                   debauch        negative
## 2503                 debaucher        negative
## 2504                debauchery        negative
## 2505                debilitate        negative
## 2506              debilitating        negative
## 2507                  debility        negative
## 2508                      debt        negative
## 2509                     debts        negative
## 2510                 decadence        negative
## 2511                  decadent        negative
## 2512                     decay        negative
## 2513                   decayed        negative
## 2514                    deceit        negative
## 2515                 deceitful        negative
## 2516               deceitfully        negative
## 2517             deceitfulness        negative
## 2518                   deceive        negative
## 2519                  deceiver        negative
## 2520                 deceivers        negative
## 2521                 deceiving        negative
## 2522                 deception        negative
## 2523                 deceptive        negative
## 2524               deceptively        negative
## 2525                   declaim        negative
## 2526                   decline        negative
## 2527                  declines        negative
## 2528                 declining        negative
## 2529                 decrement        negative
## 2530                  decrepit        negative
## 2531               decrepitude        negative
## 2532                     decry        negative
## 2533                defamation        negative
## 2534               defamations        negative
## 2535                defamatory        negative
## 2536                    defame        negative
## 2537                    defect        negative
## 2538                 defective        negative
## 2539                   defects        negative
## 2540                 defensive        negative
## 2541                  defiance        negative
## 2542                   defiant        negative
## 2543                 defiantly        negative
## 2544              deficiencies        negative
## 2545                deficiency        negative
## 2546                 deficient        negative
## 2547                    defile        negative
## 2548                   defiler        negative
## 2549                    deform        negative
## 2550                  deformed        negative
## 2551                defrauding        negative
## 2552                   defunct        negative
## 2553                      defy        negative
## 2554                degenerate        negative
## 2555              degenerately        negative
## 2556              degeneration        negative
## 2557               degradation        negative
## 2558                   degrade        negative
## 2559                 degrading        negative
## 2560               degradingly        negative
## 2561            dehumanization        negative
## 2562                dehumanize        negative
## 2563                     deign        negative
## 2564                    deject        negative
## 2565                  dejected        negative
## 2566                dejectedly        negative
## 2567                 dejection        negative
## 2568                     delay        negative
## 2569                   delayed        negative
## 2570                  delaying        negative
## 2571                    delays        negative
## 2572               delinquency        negative
## 2573                delinquent        negative
## 2574                 delirious        negative
## 2575                  delirium        negative
## 2576                    delude        negative
## 2577                   deluded        negative
## 2578                    deluge        negative
## 2579                  delusion        negative
## 2580                delusional        negative
## 2581                 delusions        negative
## 2582                    demean        negative
## 2583                 demeaning        negative
## 2584                    demise        negative
## 2585                  demolish        negative
## 2586                demolisher        negative
## 2587                     demon        negative
## 2588                   demonic        negative
## 2589                  demonize        negative
## 2590                 demonized        negative
## 2591                 demonizes        negative
## 2592                demonizing        negative
## 2593                demoralize        negative
## 2594              demoralizing        negative
## 2595            demoralizingly        negative
## 2596                    denial        negative
## 2597                    denied        negative
## 2598                    denies        negative
## 2599                 denigrate        negative
## 2600                  denounce        negative
## 2601                     dense        negative
## 2602                      dent        negative
## 2603                    dented        negative
## 2604                     dents        negative
## 2605                denunciate        negative
## 2606              denunciation        negative
## 2607             denunciations        negative
## 2608                      deny        negative
## 2609                   denying        negative
## 2610                   deplete        negative
## 2611                deplorable        negative
## 2612                deplorably        negative
## 2613                   deplore        negative
## 2614                 deploring        negative
## 2615               deploringly        negative
## 2616                   deprave        negative
## 2617                  depraved        negative
## 2618                depravedly        negative
## 2619                 deprecate        negative
## 2620                   depress        negative
## 2621                 depressed        negative
## 2622                depressing        negative
## 2623              depressingly        negative
## 2624                depression        negative
## 2625               depressions        negative
## 2626                   deprive        negative
## 2627                  deprived        negative
## 2628                    deride        negative
## 2629                  derision        negative
## 2630                  derisive        negative
## 2631                derisively        negative
## 2632              derisiveness        negative
## 2633                derogatory        negative
## 2634                 desecrate        negative
## 2635                    desert        negative
## 2636                 desertion        negative
## 2637                 desiccate        negative
## 2638                desiccated        negative
## 2639                desititute        negative
## 2640                  desolate        negative
## 2641                desolately        negative
## 2642                desolation        negative
## 2643                   despair        negative
## 2644                despairing        negative
## 2645              despairingly        negative
## 2646                 desperate        negative
## 2647               desperately        negative
## 2648               desperation        negative
## 2649                despicable        negative
## 2650                despicably        negative
## 2651                   despise        negative
## 2652                  despised        negative
## 2653                   despoil        negative
## 2654                 despoiler        negative
## 2655               despondence        negative
## 2656               despondency        negative
## 2657                despondent        negative
## 2658              despondently        negative
## 2659                    despot        negative
## 2660                  despotic        negative
## 2661                 despotism        negative
## 2662           destabilisation        negative
## 2663                  destains        negative
## 2664                 destitute        negative
## 2665               destitution        negative
## 2666                   destroy        negative
## 2667                 destroyer        negative
## 2668               destruction        negative
## 2669               destructive        negative
## 2670                 desultory        negative
## 2671                     deter        negative
## 2672               deteriorate        negative
## 2673             deteriorating        negative
## 2674             deterioration        negative
## 2675                 deterrent        negative
## 2676                    detest        negative
## 2677                detestable        negative
## 2678                detestably        negative
## 2679                  detested        negative
## 2680                 detesting        negative
## 2681                   detests        negative
## 2682                   detract        negative
## 2683                 detracted        negative
## 2684                detracting        negative
## 2685                detraction        negative
## 2686                  detracts        negative
## 2687                 detriment        negative
## 2688               detrimental        negative
## 2689                 devastate        negative
## 2690                devastated        negative
## 2691                devastates        negative
## 2692               devastating        negative
## 2693             devastatingly        negative
## 2694               devastation        negative
## 2695                   deviate        negative
## 2696                 deviation        negative
## 2697                     devil        negative
## 2698                  devilish        negative
## 2699                devilishly        negative
## 2700                 devilment        negative
## 2701                   devilry        negative
## 2702                   devious        negative
## 2703                 deviously        negative
## 2704               deviousness        negative
## 2705                    devoid        negative
## 2706                  diabolic        negative
## 2707                diabolical        negative
## 2708              diabolically        negative
## 2709             diametrically        negative
## 2710               diappointed        negative
## 2711                  diatribe        negative
## 2712                 diatribes        negative
## 2713                      dick        negative
## 2714                  dictator        negative
## 2715               dictatorial        negative
## 2716                       die        negative
## 2717                  die hard        negative
## 2718                      died        negative
## 2719                      dies        negative
## 2720                 difficult        negative
## 2721              difficulties        negative
## 2722                difficulty        negative
## 2723                diffidence        negative
## 2724               dilapidated        negative
## 2725                   dilemma        negative
## 2726               dilly dally        negative
## 2727                       dim        negative
## 2728                    dimmer        negative
## 2729                       din        negative
## 2730                      ding        negative
## 2731                     dings        negative
## 2732                     dinky        negative
## 2733                      dire        negative
## 2734                    direly        negative
## 2735                  direness        negative
## 2736                      dirt        negative
## 2737                   dirtbag        negative
## 2738                  dirtbags        negative
## 2739                     dirts        negative
## 2740                     dirty        negative
## 2741                   disable        negative
## 2742                  disabled        negative
## 2743                 disaccord        negative
## 2744              disadvantage        negative
## 2745             disadvantaged        negative
## 2746           disadvantageous        negative
## 2747             disadvantages        negative
## 2748                 disaffect        negative
## 2749               disaffected        negative
## 2750                 disaffirm        negative
## 2751                  disagree        negative
## 2752              disagreeable        negative
## 2753              disagreeably        negative
## 2754                 disagreed        negative
## 2755               disagreeing        negative
## 2756              disagreement        negative
## 2757                 disagrees        negative
## 2758                  disallow        negative
## 2759               disapointed        negative
## 2760              disapointing        negative
## 2761             disapointment        negative
## 2762                disappoint        negative
## 2763              disappointed        negative
## 2764             disappointing        negative
## 2765           disappointingly        negative
## 2766            disappointment        negative
## 2767           disappointments        negative
## 2768               disappoints        negative
## 2769            disapprobation        negative
## 2770               disapproval        negative
## 2771                disapprove        negative
## 2772              disapproving        negative
## 2773                    disarm        negative
## 2774                  disarray        negative
## 2775                  disaster        negative
## 2776               disasterous        negative
## 2777                disastrous        negative
## 2778              disastrously        negative
## 2779                   disavow        negative
## 2780                 disavowal        negative
## 2781                 disbelief        negative
## 2782                disbelieve        negative
## 2783               disbeliever        negative
## 2784                  disclaim        negative
## 2785            discombobulate        negative
## 2786                 discomfit        negative
## 2787            discomfititure        negative
## 2788                discomfort        negative
## 2789                discompose        negative
## 2790                disconcert        negative
## 2791              disconcerted        negative
## 2792             disconcerting        negative
## 2793           disconcertingly        negative
## 2794              disconsolate        negative
## 2795            disconsolately        negative
## 2796            disconsolation        negative
## 2797                discontent        negative
## 2798              discontented        negative
## 2799            discontentedly        negative
## 2800              discontinued        negative
## 2801             discontinuity        negative
## 2802             discontinuous        negative
## 2803                   discord        negative
## 2804               discordance        negative
## 2805                discordant        negative
## 2806            discountenance        negative
## 2807                discourage        negative
## 2808            discouragement        negative
## 2809              discouraging        negative
## 2810            discouragingly        negative
## 2811              discourteous        negative
## 2812            discourteously        negative
## 2813              discoutinous        negative
## 2814                 discredit        negative
## 2815                discrepant        negative
## 2816              discriminate        negative
## 2817            discrimination        negative
## 2818            discriminatory        negative
## 2819                   disdain        negative
## 2820                 disdained        negative
## 2821                disdainful        negative
## 2822              disdainfully        negative
## 2823                  disfavor        negative
## 2824                  disgrace        negative
## 2825                 disgraced        negative
## 2826               disgraceful        negative
## 2827             disgracefully        negative
## 2828                disgruntle        negative
## 2829               disgruntled        negative
## 2830                   disgust        negative
## 2831                 disgusted        negative
## 2832               disgustedly        negative
## 2833                disgustful        negative
## 2834              disgustfully        negative
## 2835                disgusting        negative
## 2836              disgustingly        negative
## 2837                dishearten        negative
## 2838             disheartening        negative
## 2839           dishearteningly        negative
## 2840                 dishonest        negative
## 2841               dishonestly        negative
## 2842                dishonesty        negative
## 2843                  dishonor        negative
## 2844              dishonorable        negative
## 2845            dishonorablely        negative
## 2846               disillusion        negative
## 2847             disillusioned        negative
## 2848           disillusionment        negative
## 2849              disillusions        negative
## 2850            disinclination        negative
## 2851               disinclined        negative
## 2852              disingenuous        negative
## 2853            disingenuously        negative
## 2854              disintegrate        negative
## 2855             disintegrated        negative
## 2856             disintegrates        negative
## 2857            disintegration        negative
## 2858               disinterest        negative
## 2859             disinterested        negative
## 2860                   dislike        negative
## 2861                  disliked        negative
## 2862                  dislikes        negative
## 2863                 disliking        negative
## 2864                dislocated        negative
## 2865                  disloyal        negative
## 2866                disloyalty        negative
## 2867                    dismal        negative
## 2868                  dismally        negative
## 2869                dismalness        negative
## 2870                    dismay        negative
## 2871                  dismayed        negative
## 2872                 dismaying        negative
## 2873               dismayingly        negative
## 2874                dismissive        negative
## 2875              dismissively        negative
## 2876              disobedience        negative
## 2877               disobedient        negative
## 2878                   disobey        negative
## 2879              disoobedient        negative
## 2880                  disorder        negative
## 2881                disordered        negative
## 2882                disorderly        negative
## 2883              disorganized        negative
## 2884                 disorient        negative
## 2885               disoriented        negative
## 2886                    disown        negative
## 2887                 disparage        negative
## 2888               disparaging        negative
## 2889             disparagingly        negative
## 2890               dispensable        negative
## 2891                  dispirit        negative
## 2892                dispirited        negative
## 2893              dispiritedly        negative
## 2894               dispiriting        negative
## 2895                  displace        negative
## 2896                 displaced        negative
## 2897                 displease        negative
## 2898                displeased        negative
## 2899               displeasing        negative
## 2900               displeasure        negative
## 2901          disproportionate        negative
## 2902                  disprove        negative
## 2903                disputable        negative
## 2904                   dispute        negative
## 2905                  disputed        negative
## 2906                  disquiet        negative
## 2907               disquieting        negative
## 2908             disquietingly        negative
## 2909               disquietude        negative
## 2910                 disregard        negative
## 2911              disregardful        negative
## 2912              disreputable        negative
## 2913                 disrepute        negative
## 2914                disrespect        negative
## 2915            disrespectable        negative
## 2916          disrespectablity        negative
## 2917             disrespectful        negative
## 2918           disrespectfully        negative
## 2919         disrespectfulness        negative
## 2920             disrespecting        negative
## 2921                   disrupt        negative
## 2922                disruption        negative
## 2923                disruptive        negative
## 2924                      diss        negative
## 2925              dissapointed        negative
## 2926             dissappointed        negative
## 2927            dissappointing        negative
## 2928           dissatisfaction        negative
## 2929           dissatisfactory        negative
## 2930              dissatisfied        negative
## 2931              dissatisfies        negative
## 2932                dissatisfy        negative
## 2933             dissatisfying        negative
## 2934                    dissed        negative
## 2935                 dissemble        negative
## 2936                dissembler        negative
## 2937                dissension        negative
## 2938                   dissent        negative
## 2939                 dissenter        negative
## 2940                dissention        negative
## 2941                disservice        negative
## 2942                    disses        negative
## 2943                dissidence        negative
## 2944                 dissident        negative
## 2945                dissidents        negative
## 2946                   dissing        negative
## 2947                 dissocial        negative
## 2948                 dissolute        negative
## 2949               dissolution        negative
## 2950                dissonance        negative
## 2951                 dissonant        negative
## 2952               dissonantly        negative
## 2953                  dissuade        negative
## 2954                dissuasive        negative
## 2955                  distains        negative
## 2956                  distaste        negative
## 2957               distasteful        negative
## 2958             distastefully        negative
## 2959                   distort        negative
## 2960                 distorted        negative
## 2961                distortion        negative
## 2962                  distorts        negative
## 2963                  distract        negative
## 2964               distracting        negative
## 2965               distraction        negative
## 2966                distraught        negative
## 2967              distraughtly        negative
## 2968            distraughtness        negative
## 2969                  distress        negative
## 2970                distressed        negative
## 2971               distressing        negative
## 2972             distressingly        negative
## 2973                  distrust        negative
## 2974               distrustful        negative
## 2975               distrusting        negative
## 2976                   disturb        negative
## 2977               disturbance        negative
## 2978                 disturbed        negative
## 2979                disturbing        negative
## 2980              disturbingly        negative
## 2981                  disunity        negative
## 2982                  disvalue        negative
## 2983                 divergent        negative
## 2984                  divisive        negative
## 2985                divisively        negative
## 2986              divisiveness        negative
## 2987                   dizzing        negative
## 2988                 dizzingly        negative
## 2989                     dizzy        negative
## 2990                 doddering        negative
## 2991                    dodgey        negative
## 2992                    dogged        negative
## 2993                  doggedly        negative
## 2994                  dogmatic        negative
## 2995                  doldrums        negative
## 2996                  domineer        negative
## 2997               domineering        negative
## 2998                   donside        negative
## 2999                      doom        negative
## 3000                    doomed        negative
## 3001                  doomsday        negative
## 3002                      dope        negative
## 3003                     doubt        negative
## 3004                  doubtful        negative
## 3005                doubtfully        negative
## 3006                    doubts        negative
## 3007                  douchbag        negative
## 3008                 douchebag        negative
## 3009                douchebags        negative
## 3010                  downbeat        negative
## 3011                  downcast        negative
## 3012                    downer        negative
## 3013                  downfall        negative
## 3014                downfallen        negative
## 3015                 downgrade        negative
## 3016               downhearted        negative
## 3017             downheartedly        negative
## 3018                  downhill        negative
## 3019                  downside        negative
## 3020                 downsides        negative
## 3021                  downturn        negative
## 3022                 downturns        negative
## 3023                      drab        negative
## 3024                 draconian        negative
## 3025                  draconic        negative
## 3026                      drag        negative
## 3027                   dragged        negative
## 3028                  dragging        negative
## 3029                   dragoon        negative
## 3030                     drags        negative
## 3031                     drain        negative
## 3032                   drained        negative
## 3033                  draining        negative
## 3034                    drains        negative
## 3035                   drastic        negative
## 3036               drastically        negative
## 3037                  drawback        negative
## 3038                 drawbacks        negative
## 3039                     dread        negative
## 3040                  dreadful        negative
## 3041                dreadfully        negative
## 3042              dreadfulness        negative
## 3043                    dreary        negative
## 3044                   dripped        negative
## 3045                  dripping        negative
## 3046                    drippy        negative
## 3047                     drips        negative
## 3048                    drones        negative
## 3049                     droop        negative
## 3050                    droops        negative
## 3051                  drop out        negative
## 3052                 drop outs        negative
## 3053                   dropout        negative
## 3054                  dropouts        negative
## 3055                   drought        negative
## 3056                  drowning        negative
## 3057                     drunk        negative
## 3058                  drunkard        negative
## 3059                   drunken        negative
## 3060                   dubious        negative
## 3061                 dubiously        negative
## 3062                 dubitable        negative
## 3063                       dud        negative
## 3064                      dull        negative
## 3065                   dullard        negative
## 3066                      dumb        negative
## 3067                 dumbfound        negative
## 3068                      dump        negative
## 3069                    dumped        negative
## 3070                   dumping        negative
## 3071                     dumps        negative
## 3072                     dunce        negative
## 3073                   dungeon        negative
## 3074                  dungeons        negative
## 3075                      dupe        negative
## 3076                      dust        negative
## 3077                     dusty        negative
## 3078                 dwindling        negative
## 3079                     dying        negative
## 3080              earsplitting        negative
## 3081                 eccentric        negative
## 3082              eccentricity        negative
## 3083                    effigy        negative
## 3084                effrontery        negative
## 3085                egocentric        negative
## 3086                  egomania        negative
## 3087                   egotism        negative
## 3088               egotistical        negative
## 3089             egotistically        negative
## 3090                 egregious        negative
## 3091               egregiously        negative
## 3092           election rigger        negative
## 3093               elimination        negative
## 3094                 emaciated        negative
## 3095                emasculate        negative
## 3096                 embarrass        negative
## 3097              embarrassing        negative
## 3098            embarrassingly        negative
## 3099             embarrassment        negative
## 3100                 embattled        negative
## 3101                   embroil        negative
## 3102                 embroiled        negative
## 3103               embroilment        negative
## 3104                 emergency        negative
## 3105                  emphatic        negative
## 3106              emphatically        negative
## 3107                 emptiness        negative
## 3108                  encroach        negative
## 3109              encroachment        negative
## 3110                  endanger        negative
## 3111                   enemies        negative
## 3112                     enemy        negative
## 3113                  enervate        negative
## 3114                  enfeeble        negative
## 3115                   enflame        negative
## 3116                    engulf        negative
## 3117                    enjoin        negative
## 3118                    enmity        negative
## 3119                    enrage        negative
## 3120                   enraged        negative
## 3121                  enraging        negative
## 3122                   enslave        negative
## 3123                  entangle        negative
## 3124              entanglement        negative
## 3125                    entrap        negative
## 3126                entrapment        negative
## 3127                   envious        negative
## 3128                 enviously        negative
## 3129               enviousness        negative
## 3130                  epidemic        negative
## 3131                 equivocal        negative
## 3132                     erase        negative
## 3133                     erode        negative
## 3134                    erodes        negative
## 3135                   erosion        negative
## 3136                       err        negative
## 3137                    errant        negative
## 3138                   erratic        negative
## 3139               erratically        negative
## 3140                 erroneous        negative
## 3141               erroneously        negative
## 3142                     error        negative
## 3143                    errors        negative
## 3144                 eruptions        negative
## 3145                  escapade        negative
## 3146                    eschew        negative
## 3147                 estranged        negative
## 3148                     evade        negative
## 3149                   evasion        negative
## 3150                   evasive        negative
## 3151                      evil        negative
## 3152                  evildoer        negative
## 3153                     evils        negative
## 3154                eviscerate        negative
## 3155                exacerbate        negative
## 3156                 exagerate        negative
## 3157                exagerated        negative
## 3158                exagerates        negative
## 3159                exaggerate        negative
## 3160              exaggeration        negative
## 3161                exasperate        negative
## 3162               exasperated        negative
## 3163              exasperating        negative
## 3164            exasperatingly        negative
## 3165              exasperation        negative
## 3166                 excessive        negative
## 3167               excessively        negative
## 3168                 exclusion        negative
## 3169                 excoriate        negative
## 3170              excruciating        negative
## 3171            excruciatingly        negative
## 3172                    excuse        negative
## 3173                   excuses        negative
## 3174                  execrate        negative
## 3175                   exhaust        negative
## 3176                 exhausted        negative
## 3177                exhaustion        negative
## 3178                  exhausts        negative
## 3179               exhorbitant        negative
## 3180                    exhort        negative
## 3181                     exile        negative
## 3182                exorbitant        negative
## 3183            exorbitantance        negative
## 3184              exorbitantly        negative
## 3185                     expel        negative
## 3186                 expensive        negative
## 3187                    expire        negative
## 3188                   expired        negative
## 3189                   explode        negative
## 3190                   exploit        negative
## 3191              exploitation        negative
## 3192                 explosive        negative
## 3193               expropriate        negative
## 3194             expropriation        negative
## 3195                   expulse        negative
## 3196                   expunge        negative
## 3197               exterminate        negative
## 3198             extermination        negative
## 3199                extinguish        negative
## 3200                    extort        negative
## 3201                 extortion        negative
## 3202                extraneous        negative
## 3203              extravagance        negative
## 3204               extravagant        negative
## 3205             extravagantly        negative
## 3206                 extremism        negative
## 3207                 extremist        negative
## 3208                extremists        negative
## 3209                   eyesore        negative
## 3210                 fabricate        negative
## 3211               fabrication        negative
## 3212                 facetious        negative
## 3213               facetiously        negative
## 3214                      fail        negative
## 3215                    failed        negative
## 3216                   failing        negative
## 3217                     fails        negative
## 3218                   failure        negative
## 3219                  failures        negative
## 3220                     faint        negative
## 3221              fainthearted        negative
## 3222                 faithless        negative
## 3223                      fake        negative
## 3224                      fall        negative
## 3225                 fallacies        negative
## 3226                fallacious        negative
## 3227              fallaciously        negative
## 3228            fallaciousness        negative
## 3229                   fallacy        negative
## 3230                    fallen        negative
## 3231                   falling        negative
## 3232                   fallout        negative
## 3233                     falls        negative
## 3234                     false        negative
## 3235                 falsehood        negative
## 3236                   falsely        negative
## 3237                   falsify        negative
## 3238                    falter        negative
## 3239                  faltered        negative
## 3240                    famine        negative
## 3241                  famished        negative
## 3242                   fanatic        negative
## 3243                 fanatical        negative
## 3244               fanatically        negative
## 3245                fanaticism        negative
## 3246                  fanatics        negative
## 3247                  fanciful        negative
## 3248               far fetched        negative
## 3249                     farce        negative
## 3250                  farcical        negative
## 3251  farcical yet provocative        negative
## 3252                farcically        negative
## 3253                farfetched        negative
## 3254                   fascism        negative
## 3255                   fascist        negative
## 3256                fastidious        negative
## 3257              fastidiously        negative
## 3258                  fastuous        negative
## 3259                       fat        negative
## 3260                   fat cat        negative
## 3261                  fat cats        negative
## 3262                     fatal        negative
## 3263                fatalistic        negative
## 3264            fatalistically        negative
## 3265                   fatally        negative
## 3266                    fatcat        negative
## 3267                   fatcats        negative
## 3268                   fateful        negative
## 3269                 fatefully        negative
## 3270                fathomless        negative
## 3271                   fatigue        negative
## 3272                  fatigued        negative
## 3273                   fatique        negative
## 3274                     fatty        negative
## 3275                   fatuity        negative
## 3276                   fatuous        negative
## 3277                 fatuously        negative
## 3278                     fault        negative
## 3279                    faults        negative
## 3280                    faulty        negative
## 3281                 fawningly        negative
## 3282                      faze        negative
## 3283                      fear        negative
## 3284                   fearful        negative
## 3285                 fearfully        negative
## 3286                     fears        negative
## 3287                  fearsome        negative
## 3288                  feckless        negative
## 3289                    feeble        negative
## 3290                  feeblely        negative
## 3291              feebleminded        negative
## 3292                     feign        negative
## 3293                     feint        negative
## 3294                      fell        negative
## 3295                     felon        negative
## 3296                 felonious        negative
## 3297               ferociously        negative
## 3298                  ferocity        negative
## 3299                     fetid        negative
## 3300                     fever        negative
## 3301                  feverish        negative
## 3302                    fevers        negative
## 3303                    fiasco        negative
## 3304                       fib        negative
## 3305                    fibber        negative
## 3306                    fickle        negative
## 3307                   fiction        negative
## 3308                 fictional        negative
## 3309                fictitious        negative
## 3310                    fidget        negative
## 3311                   fidgety        negative
## 3312                     fiend        negative
## 3313                  fiendish        negative
## 3314                    fierce        negative
## 3315                figurehead        negative
## 3316                     filth        negative
## 3317                    filthy        negative
## 3318                   finagle        negative
## 3319                   finicky        negative
## 3320                  fissures        negative
## 3321                      fist        negative
## 3322               flabbergast        negative
## 3323             flabbergasted        negative
## 3324                  flagging        negative
## 3325                  flagrant        negative
## 3326                flagrantly        negative
## 3327                     flair        negative
## 3328                    flairs        negative
## 3329                      flak        negative
## 3330                     flake        negative
## 3331                    flakey        negative
## 3332                flakieness        negative
## 3333                   flaking        negative
## 3334                     flaky        negative
## 3335                     flare        negative
## 3336                    flares        negative
## 3337                   flareup        negative
## 3338                  flareups        negative
## 3339                  flat out        negative
## 3340                    flaunt        negative
## 3341                      flaw        negative
## 3342                    flawed        negative
## 3343                     flaws        negative
## 3344                      flee        negative
## 3345                     fleed        negative
## 3346                   fleeing        negative
## 3347                     fleer        negative
## 3348                     flees        negative
## 3349                  fleeting        negative
## 3350                 flicering        negative
## 3351                   flicker        negative
## 3352                flickering        negative
## 3353                  flickers        negative
## 3354                   flighty        negative
## 3355                  flimflam        negative
## 3356                    flimsy        negative
## 3357                     flirt        negative
## 3358                    flirty        negative
## 3359                   floored        negative
## 3360                  flounder        negative
## 3361               floundering        negative
## 3362                     flout        negative
## 3363                   fluster        negative
## 3364                       foe        negative
## 3365                      fool        negative
## 3366                    fooled        negative
## 3367                 foolhardy        negative
## 3368                   foolish        negative
## 3369                 foolishly        negative
## 3370               foolishness        negative
## 3371                    forbid        negative
## 3372                 forbidden        negative
## 3373                forbidding        negative
## 3374                  forceful        negative
## 3375                foreboding        negative
## 3376              forebodingly        negative
## 3377                   forfeit        negative
## 3378                    forged        negative
## 3379                 forgetful        negative
## 3380               forgetfully        negative
## 3381             forgetfulness        negative
## 3382                   forlorn        negative
## 3383                 forlornly        negative
## 3384                   forsake        negative
## 3385                  forsaken        negative
## 3386                  forswear        negative
## 3387                      foul        negative
## 3388                    foully        negative
## 3389                  foulness        negative
## 3390                 fractious        negative
## 3391               fractiously        negative
## 3392                  fracture        negative
## 3393                   fragile        negative
## 3394                fragmented        negative
## 3395                     frail        negative
## 3396                   frantic        negative
## 3397               frantically        negative
## 3398                 franticly        negative
## 3399                     fraud        negative
## 3400                fraudulent        negative
## 3401                   fraught        negative
## 3402                   frazzle        negative
## 3403                  frazzled        negative
## 3404                     freak        negative
## 3405                  freaking        negative
## 3406                  freakish        negative
## 3407                freakishly        negative
## 3408                    freaks        negative
## 3409                    freeze        negative
## 3410                   freezes        negative
## 3411                  freezing        negative
## 3412                  frenetic        negative
## 3413              frenetically        negative
## 3414                  frenzied        negative
## 3415                    frenzy        negative
## 3416                      fret        negative
## 3417                   fretful        negative
## 3418                     frets        negative
## 3419                  friction        negative
## 3420                 frictions        negative
## 3421                     fried        negative
## 3422                   friggin        negative
## 3423                  frigging        negative
## 3424                    fright        negative
## 3425                  frighten        negative
## 3426               frightening        negative
## 3427             frighteningly        negative
## 3428                 frightful        negative
## 3429               frightfully        negative
## 3430                    frigid        negative
## 3431                     frost        negative
## 3432                     frown        negative
## 3433                     froze        negative
## 3434                    frozen        negative
## 3435                 fruitless        negative
## 3436               fruitlessly        negative
## 3437                 frustrate        negative
## 3438                frustrated        negative
## 3439                frustrates        negative
## 3440               frustrating        negative
## 3441             frustratingly        negative
## 3442               frustration        negative
## 3443              frustrations        negative
## 3444                      fuck        negative
## 3445                   fucking        negative
## 3446                     fudge        negative
## 3447                  fugitive        negative
## 3448                full blown        negative
## 3449                 fulminate        negative
## 3450                    fumble        negative
## 3451                      fume        negative
## 3452                     fumes        negative
## 3453            fundamentalism        negative
## 3454                     funky        negative
## 3455                   funnily        negative
## 3456                     funny        negative
## 3457                   furious        negative
## 3458                 furiously        negative
## 3459                     furor        negative
## 3460                      fury        negative
## 3461                      fuss        negative
## 3462                     fussy        negative
## 3463                 fustigate        negative
## 3464                     fusty        negative
## 3465                    futile        negative
## 3466                  futilely        negative
## 3467                  futility        negative
## 3468                     fuzzy        negative
## 3469                    gabble        negative
## 3470                      gaff        negative
## 3471                     gaffe        negative
## 3472                   gainsay        negative
## 3473                 gainsayer        negative
## 3474                      gall        negative
## 3475                   galling        negative
## 3476                 gallingly        negative
## 3477                     galls        negative
## 3478                  gangster        negative
## 3479                      gape        negative
## 3480                   garbage        negative
## 3481                    garish        negative
## 3482                      gasp        negative
## 3483                    gauche        negative
## 3484                     gaudy        negative
## 3485                      gawk        negative
## 3486                     gawky        negative
## 3487                    geezer        negative
## 3488                  genocide        negative
## 3489                  get rich        negative
## 3490                   ghastly        negative
## 3491                    ghetto        negative
## 3492                  ghosting        negative
## 3493                    gibber        negative
## 3494                 gibberish        negative
## 3495                      gibe        negative
## 3496                     giddy        negative
## 3497                   gimmick        negative
## 3498                 gimmicked        negative
## 3499                gimmicking        negative
## 3500                  gimmicks        negative
## 3501                  gimmicky        negative
## 3502                     glare        negative
## 3503                 glaringly        negative
## 3504                      glib        negative
## 3505                    glibly        negative
## 3506                    glitch        negative
## 3507                  glitches        negative
## 3508                gloatingly        negative
## 3509                     gloom        negative
## 3510                    gloomy        negative
## 3511                    glower        negative
## 3512                      glum        negative
## 3513                      glut        negative
## 3514                   gnawing        negative
## 3515                      goad        negative
## 3516                   goading        negative
## 3517                 god awful        negative
## 3518                      goof        negative
## 3519                     goofy        negative
## 3520                      goon        negative
## 3521                    gossip        negative
## 3522                 graceless        negative
## 3523               gracelessly        negative
## 3524                     graft        negative
## 3525                    grainy        negative
## 3526                   grapple        negative
## 3527                     grate        negative
## 3528                   grating        negative
## 3529                   gravely        negative
## 3530                    greasy        negative
## 3531                     greed        negative
## 3532                    greedy        negative
## 3533                     grief        negative
## 3534                 grievance        negative
## 3535                grievances        negative
## 3536                    grieve        negative
## 3537                  grieving        negative
## 3538                  grievous        negative
## 3539                grievously        negative
## 3540                      grim        negative
## 3541                   grimace        negative
## 3542                     grind        negative
## 3543                     gripe        negative
## 3544                    gripes        negative
## 3545                    grisly        negative
## 3546                    gritty        negative
## 3547                     gross        negative
## 3548                   grossly        negative
## 3549                 grotesque        negative
## 3550                    grouch        negative
## 3551                   grouchy        negative
## 3552                groundless        negative
## 3553                    grouse        negative
## 3554                     growl        negative
## 3555                    grudge        negative
## 3556                   grudges        negative
## 3557                  grudging        negative
## 3558                grudgingly        negative
## 3559                  gruesome        negative
## 3560                gruesomely        negative
## 3561                     gruff        negative
## 3562                   grumble        negative
## 3563                  grumpier        negative
## 3564                 grumpiest        negative
## 3565                  grumpily        negative
## 3566                  grumpish        negative
## 3567                    grumpy        negative
## 3568                     guile        negative
## 3569                     guilt        negative
## 3570                  guiltily        negative
## 3571                    guilty        negative
## 3572                  gullible        negative
## 3573                   gutless        negative
## 3574                    gutter        negative
## 3575                      hack        negative
## 3576                     hacks        negative
## 3577                   haggard        negative
## 3578                    haggle        negative
## 3579                  hairloss        negative
## 3580               halfhearted        negative
## 3581             halfheartedly        negative
## 3582               hallucinate        negative
## 3583             hallucination        negative
## 3584                    hamper        negative
## 3585                  hampered        negative
## 3586               handicapped        negative
## 3587                      hang        negative
## 3588                     hangs        negative
## 3589                 haphazard        negative
## 3590                   hapless        negative
## 3591                  harangue        negative
## 3592                    harass        negative
## 3593                  harassed        negative
## 3594                  harasses        negative
## 3595                harassment        negative
## 3596                 harboring        negative
## 3597                   harbors        negative
## 3598                      hard        negative
## 3599                  hard hit        negative
## 3600                 hard line        negative
## 3601                hard liner        negative
## 3602                  hardball        negative
## 3603                    harden        negative
## 3604                  hardened        negative
## 3605                hardheaded        negative
## 3606               hardhearted        negative
## 3607                 hardliner        negative
## 3608                hardliners        negative
## 3609                  hardship        negative
## 3610                 hardships        negative
## 3611                      harm        negative
## 3612                    harmed        negative
## 3613                   harmful        negative
## 3614                     harms        negative
## 3615                     harpy        negative
## 3616                  harridan        negative
## 3617                   harried        negative
## 3618                    harrow        negative
## 3619                     harsh        negative
## 3620                   harshly        negative
## 3621                 hasseling        negative
## 3622                    hassle        negative
## 3623                   hassled        negative
## 3624                   hassles        negative
## 3625                     haste        negative
## 3626                   hastily        negative
## 3627                     hasty        negative
## 3628                      hate        negative
## 3629                     hated        negative
## 3630                   hateful        negative
## 3631                 hatefully        negative
## 3632               hatefulness        negative
## 3633                     hater        negative
## 3634                    haters        negative
## 3635                     hates        negative
## 3636                    hating        negative
## 3637                    hatred        negative
## 3638                 haughtily        negative
## 3639                   haughty        negative
## 3640                     haunt        negative
## 3641                  haunting        negative
## 3642                     havoc        negative
## 3643                   hawkish        negative
## 3644                   haywire        negative
## 3645                    hazard        negative
## 3646                 hazardous        negative
## 3647                      haze        negative
## 3648                      hazy        negative
## 3649                head aches        negative
## 3650                  headache        negative
## 3651                 headaches        negative
## 3652              heartbreaker        negative
## 3653             heartbreaking        negative
## 3654           heartbreakingly        negative
## 3655                 heartless        negative
## 3656                   heathen        negative
## 3657              heavy handed        negative
## 3658              heavyhearted        negative
## 3659                      heck        negative
## 3660                    heckle        negative
## 3661                   heckled        negative
## 3662                   heckles        negative
## 3663                    hectic        negative
## 3664                     hedge        negative
## 3665                hedonistic        negative
## 3666                  heedless        negative
## 3667                     hefty        negative
## 3668                hegemonism        negative
## 3669              hegemonistic        negative
## 3670                  hegemony        negative
## 3671                   heinous        negative
## 3672                      hell        negative
## 3673                 hell bent        negative
## 3674                   hellion        negative
## 3675                     hells        negative
## 3676                  helpless        negative
## 3677                helplessly        negative
## 3678              helplessness        negative
## 3679                    heresy        negative
## 3680                   heretic        negative
## 3681                 heretical        negative
## 3682                  hesitant        negative
## 3683                 hestitant        negative
## 3684                   hideous        negative
## 3685                 hideously        negative
## 3686               hideousness        negative
## 3687               high priced        negative
## 3688                hiliarious        negative
## 3689                    hinder        negative
## 3690                 hindrance        negative
## 3691                      hiss        negative
## 3692                    hissed        negative
## 3693                   hissing        negative
## 3694                    ho hum        negative
## 3695                     hoard        negative
## 3696                      hoax        negative
## 3697                    hobble        negative
## 3698                      hogs        negative
## 3699                    hollow        negative
## 3700                   hoodium        negative
## 3701                  hoodwink        negative
## 3702                  hooligan        negative
## 3703                  hopeless        negative
## 3704                hopelessly        negative
## 3705              hopelessness        negative
## 3706                     horde        negative
## 3707                horrendous        negative
## 3708              horrendously        negative
## 3709                  horrible        negative
## 3710                    horrid        negative
## 3711                  horrific        negative
## 3712                 horrified        negative
## 3713                 horrifies        negative
## 3714                   horrify        negative
## 3715                horrifying        negative
## 3716                  horrifys        negative
## 3717                   hostage        negative
## 3718                   hostile        negative
## 3719               hostilities        negative
## 3720                 hostility        negative
## 3721                   hotbeds        negative
## 3722                   hothead        negative
## 3723                 hotheaded        negative
## 3724                  hothouse        negative
## 3725                    hubris        negative
## 3726                  huckster        negative
## 3727                       hum        negative
## 3728                     humid        negative
## 3729                 humiliate        negative
## 3730               humiliating        negative
## 3731               humiliation        negative
## 3732                   humming        negative
## 3733                      hung        negative
## 3734                      hurt        negative
## 3735                    hurted        negative
## 3736                   hurtful        negative
## 3737                   hurting        negative
## 3738                     hurts        negative
## 3739                   hustler        negative
## 3740                      hype        negative
## 3741                 hypocricy        negative
## 3742                 hypocrisy        negative
## 3743                 hypocrite        negative
## 3744                hypocrites        negative
## 3745              hypocritical        negative
## 3746            hypocritically        negative
## 3747                  hysteria        negative
## 3748                  hysteric        negative
## 3749                hysterical        negative
## 3750              hysterically        negative
## 3751                 hysterics        negative
## 3752                  idiocies        negative
## 3753                    idiocy        negative
## 3754                     idiot        negative
## 3755                   idiotic        negative
## 3756               idiotically        negative
## 3757                    idiots        negative
## 3758                      idle        negative
## 3759                   ignoble        negative
## 3760               ignominious        negative
## 3761             ignominiously        negative
## 3762                  ignominy        negative
## 3763                 ignorance        negative
## 3764                  ignorant        negative
## 3765                    ignore        negative
## 3766               ill advised        negative
## 3767             ill conceived        negative
## 3768               ill defined        negative
## 3769              ill designed        negative
## 3770                 ill fated        negative
## 3771               ill favored        negative
## 3772                ill formed        negative
## 3773              ill mannered        negative
## 3774               ill natured        negative
## 3775                ill sorted        negative
## 3776              ill tempered        negative
## 3777               ill treated        negative
## 3778             ill treatment        negative
## 3779                 ill usage        negative
## 3780                  ill used        negative
## 3781                   illegal        negative
## 3782                 illegally        negative
## 3783              illegitimate        negative
## 3784                   illicit        negative
## 3785                illiterate        negative
## 3786                   illness        negative
## 3787                   illogic        negative
## 3788                 illogical        negative
## 3789               illogically        negative
## 3790                  illusion        negative
## 3791                 illusions        negative
## 3792                  illusory        negative
## 3793                 imaginary        negative
## 3794                 imbalance        negative
## 3795                  imbecile        negative
## 3796                 imbroglio        negative
## 3797                immaterial        negative
## 3798                  immature        negative
## 3799                 imminence        negative
## 3800                imminently        negative
## 3801               immobilized        negative
## 3802                immoderate        negative
## 3803              immoderately        negative
## 3804                  immodest        negative
## 3805                   immoral        negative
## 3806                immorality        negative
## 3807                 immorally        negative
## 3808                 immovable        negative
## 3809                    impair        negative
## 3810                  impaired        negative
## 3811                   impasse        negative
## 3812                impatience        negative
## 3813                 impatient        negative
## 3814               impatiently        negative
## 3815                   impeach        negative
## 3816                 impedance        negative
## 3817                    impede        negative
## 3818                impediment        negative
## 3819                 impending        negative
## 3820                impenitent        negative
## 3821                 imperfect        negative
## 3822              imperfection        negative
## 3823             imperfections        negative
## 3824               imperfectly        negative
## 3825               imperialist        negative
## 3826                   imperil        negative
## 3827                 imperious        negative
## 3828               imperiously        negative
## 3829             impermissible        negative
## 3830                impersonal        negative
## 3831               impertinent        negative
## 3832                 impetuous        negative
## 3833               impetuously        negative
## 3834                   impiety        negative
## 3835                   impinge        negative
## 3836                   impious        negative
## 3837                implacable        negative
## 3838               implausible        negative
## 3839               implausibly        negative
## 3840                 implicate        negative
## 3841               implication        negative
## 3842                   implode        negative
## 3843                  impolite        negative
## 3844                impolitely        negative
## 3845                 impolitic        negative
## 3846               importunate        negative
## 3847                 importune        negative
## 3848                    impose        negative
## 3849                  imposers        negative
## 3850                  imposing        negative
## 3851                imposition        negative
## 3852                impossible        negative
## 3853              impossiblity        negative
## 3854                impossibly        negative
## 3855                  impotent        negative
## 3856                impoverish        negative
## 3857              impoverished        negative
## 3858               impractical        negative
## 3859                 imprecate        negative
## 3860                 imprecise        negative
## 3861               imprecisely        negative
## 3862               imprecision        negative
## 3863                  imprison        negative
## 3864              imprisonment        negative
## 3865             improbability        negative
## 3866                improbable        negative
## 3867                improbably        negative
## 3868                  improper        negative
## 3869                improperly        negative
## 3870               impropriety        negative
## 3871                imprudence        negative
## 3872                 imprudent        negative
## 3873                 impudence        negative
## 3874                  impudent        negative
## 3875                impudently        negative
## 3876                    impugn        negative
## 3877                 impulsive        negative
## 3878               impulsively        negative
## 3879                  impunity        negative
## 3880                    impure        negative
## 3881                  impurity        negative
## 3882                 inability        negative
## 3883              inaccuracies        negative
## 3884                inaccuracy        negative
## 3885                inaccurate        negative
## 3886              inaccurately        negative
## 3887                  inaction        negative
## 3888                  inactive        negative
## 3889                inadequacy        negative
## 3890                inadequate        negative
## 3891              inadequately        negative
## 3892                inadverent        negative
## 3893              inadverently        negative
## 3894               inadvisable        negative
## 3895               inadvisably        negative
## 3896                     inane        negative
## 3897                   inanely        negative
## 3898             inappropriate        negative
## 3899           inappropriately        negative
## 3900                     inapt        negative
## 3901                inaptitude        negative
## 3902              inarticulate        negative
## 3903               inattentive        negative
## 3904                 inaudible        negative
## 3905                 incapable        negative
## 3906                 incapably        negative
## 3907                incautious        negative
## 3908                incendiary        negative
## 3909                   incense        negative
## 3910                 incessant        negative
## 3911               incessantly        negative
## 3912                    incite        negative
## 3913                incitement        negative
## 3914                incivility        negative
## 3915                 inclement        negative
## 3916               incognizant        negative
## 3917               incoherence        negative
## 3918                incoherent        negative
## 3919              incoherently        negative
## 3920            incommensurate        negative
## 3921              incomparable        negative
## 3922              incomparably        negative
## 3923           incompatability        negative
## 3924           incompatibility        negative
## 3925              incompatible        negative
## 3926              incompetence        negative
## 3927               incompetent        negative
## 3928             incompetently        negative
## 3929                incomplete        negative
## 3930               incompliant        negative
## 3931          incomprehensible        negative
## 3932           incomprehension        negative
## 3933             inconceivable        negative
## 3934             inconceivably        negative
## 3935               incongruous        negative
## 3936             incongruously        negative
## 3937              inconsequent        negative
## 3938           inconsequential        negative
## 3939         inconsequentially        negative
## 3940            inconsequently        negative
## 3941             inconsiderate        negative
## 3942           inconsiderately        negative
## 3943             inconsistence        negative
## 3944           inconsistencies        negative
## 3945             inconsistency        negative
## 3946              inconsistent        negative
## 3947              inconsolable        negative
## 3948              inconsolably        negative
## 3949                inconstant        negative
## 3950             inconvenience        negative
## 3951            inconveniently        negative
## 3952                 incorrect        negative
## 3953               incorrectly        negative
## 3954              incorrigible        negative
## 3955              incorrigibly        negative
## 3956               incredulous        negative
## 3957             incredulously        negative
## 3958                 inculcate        negative
## 3959                 indecency        negative
## 3960                  indecent        negative
## 3961                indecently        negative
## 3962                indecision        negative
## 3963                indecisive        negative
## 3964              indecisively        negative
## 3965                 indecorum        negative
## 3966              indefensible        negative
## 3967                indelicate        negative
## 3968            indeterminable        negative
## 3969            indeterminably        negative
## 3970             indeterminate        negative
## 3971              indifference        negative
## 3972               indifferent        negative
## 3973                  indigent        negative
## 3974                 indignant        negative
## 3975               indignantly        negative
## 3976               indignation        negative
## 3977                 indignity        negative
## 3978             indiscernible        negative
## 3979                indiscreet        negative
## 3980              indiscreetly        negative
## 3981              indiscretion        negative
## 3982            indiscriminate        negative
## 3983          indiscriminately        negative
## 3984          indiscriminating        negative
## 3985         indistinguishable        negative
## 3986              indoctrinate        negative
## 3987            indoctrination        negative
## 3988                  indolent        negative
## 3989                   indulge        negative
## 3990               ineffective        negative
## 3991             ineffectively        negative
## 3992           ineffectiveness        negative
## 3993               ineffectual        negative
## 3994             ineffectually        negative
## 3995           ineffectualness        negative
## 3996             inefficacious        negative
## 3997                inefficacy        negative
## 3998              inefficiency        negative
## 3999               inefficient        negative
## 4000             inefficiently        negative
## 4001                inelegance        negative
## 4002                 inelegant        negative
## 4003                ineligible        negative
## 4004                ineloquent        negative
## 4005              ineloquently        negative
## 4006                     inept        negative
## 4007                ineptitude        negative
## 4008                   ineptly        negative
## 4009              inequalities        negative
## 4010                inequality        negative
## 4011               inequitable        negative
## 4012               inequitably        negative
## 4013                inequities        negative
## 4014               inescapable        negative
## 4015               inescapably        negative
## 4016               inessential        negative
## 4017                inevitable        negative
## 4018                inevitably        negative
## 4019               inexcusable        negative
## 4020               inexcusably        negative
## 4021                inexorable        negative
## 4022                inexorably        negative
## 4023              inexperience        negative
## 4024             inexperienced        negative
## 4025                  inexpert        negative
## 4026                inexpertly        negative
## 4027                inexpiable        negative
## 4028             inexplainable        negative
## 4029              inextricable        negative
## 4030              inextricably        negative
## 4031                  infamous        negative
## 4032                infamously        negative
## 4033                    infamy        negative
## 4034                  infected        negative
## 4035                 infection        negative
## 4036                infections        negative
## 4037                  inferior        negative
## 4038               inferiority        negative
## 4039                  infernal        negative
## 4040                    infest        negative
## 4041                  infested        negative
## 4042                   infidel        negative
## 4043                  infidels        negative
## 4044               infiltrator        negative
## 4045              infiltrators        negative
## 4046                    infirm        negative
## 4047                   inflame        negative
## 4048              inflammation        negative
## 4049              inflammatory        negative
## 4050                 inflammed        negative
## 4051                  inflated        negative
## 4052              inflationary        negative
## 4053                inflexible        negative
## 4054                   inflict        negative
## 4055                infraction        negative
## 4056                  infringe        negative
## 4057              infringement        negative
## 4058             infringements        negative
## 4059                 infuriate        negative
## 4060                infuriated        negative
## 4061               infuriating        negative
## 4062             infuriatingly        negative
## 4063                inglorious        negative
## 4064                   ingrate        negative
## 4065               ingratitude        negative
## 4066                   inhibit        negative
## 4067                inhibition        negative
## 4068              inhospitable        negative
## 4069             inhospitality        negative
## 4070                   inhuman        negative
## 4071                  inhumane        negative
## 4072                inhumanity        negative
## 4073                  inimical        negative
## 4074                inimically        negative
## 4075                iniquitous        negative
## 4076                  iniquity        negative
## 4077               injudicious        negative
## 4078                    injure        negative
## 4079                 injurious        negative
## 4080                    injury        negative
## 4081                 injustice        negative
## 4082                injustices        negative
## 4083                  innuendo        negative
## 4084                inoperable        negative
## 4085               inopportune        negative
## 4086                inordinate        negative
## 4087              inordinately        negative
## 4088                    insane        negative
## 4089                  insanely        negative
## 4090                  insanity        negative
## 4091                insatiable        negative
## 4092                  insecure        negative
## 4093                insecurity        negative
## 4094                insensible        negative
## 4095               insensitive        negative
## 4096             insensitively        negative
## 4097             insensitivity        negative
## 4098                 insidious        negative
## 4099               insidiously        negative
## 4100            insignificance        negative
## 4101             insignificant        negative
## 4102           insignificantly        negative
## 4103                 insincere        negative
## 4104               insincerely        negative
## 4105               insincerity        negative
## 4106                 insinuate        negative
## 4107               insinuating        negative
## 4108               insinuation        negative
## 4109                insociable        negative
## 4110                 insolence        negative
## 4111                  insolent        negative
## 4112                insolently        negative
## 4113                 insolvent        negative
## 4114               insouciance        negative
## 4115               instability        negative
## 4116                  instable        negative
## 4117                 instigate        negative
## 4118                instigator        negative
## 4119               instigators        negative
## 4120             insubordinate        negative
## 4121             insubstantial        negative
## 4122           insubstantially        negative
## 4123              insufferable        negative
## 4124              insufferably        negative
## 4125             insufficiency        negative
## 4126              insufficient        negative
## 4127            insufficiently        negative
## 4128                   insular        negative
## 4129                    insult        negative
## 4130                  insulted        negative
## 4131                 insulting        negative
## 4132               insultingly        negative
## 4133                   insults        negative
## 4134             insupportable        negative
## 4135             insupportably        negative
## 4136            insurmountable        negative
## 4137            insurmountably        negative
## 4138              insurrection        negative
## 4139                  intefere        negative
## 4140                 inteferes        negative
## 4141                   intense        negative
## 4142                 interfere        negative
## 4143              interference        negative
## 4144                interferes        negative
## 4145              intermittent        negative
## 4146                 interrupt        negative
## 4147              interruption        negative
## 4148             interruptions        negative
## 4149                intimidate        negative
## 4150              intimidating        negative
## 4151            intimidatingly        negative
## 4152              intimidation        negative
## 4153               intolerable        negative
## 4154             intolerablely        negative
## 4155               intolerance        negative
## 4156                intoxicate        negative
## 4157               intractable        negative
## 4158             intransigence        negative
## 4159              intransigent        negative
## 4160                   intrude        negative
## 4161                 intrusion        negative
## 4162                 intrusive        negative
## 4163                  inundate        negative
## 4164                 inundated        negative
## 4165                   invader        negative
## 4166                   invalid        negative
## 4167                invalidate        negative
## 4168                invalidity        negative
## 4169                  invasive        negative
## 4170                 invective        negative
## 4171                  inveigle        negative
## 4172                 invidious        negative
## 4173               invidiously        negative
## 4174             invidiousness        negative
## 4175                 invisible        negative
## 4176             involuntarily        negative
## 4177               involuntary        negative
## 4178                 irascible        negative
## 4179                     irate        negative
## 4180                   irately        negative
## 4181                       ire        negative
## 4182                       irk        negative
## 4183                     irked        negative
## 4184                    irking        negative
## 4185                      irks        negative
## 4186                   irksome        negative
## 4187                 irksomely        negative
## 4188               irksomeness        negative
## 4189             irksomenesses        negative
## 4190                    ironic        negative
## 4191                  ironical        negative
## 4192                ironically        negative
## 4193                   ironies        negative
## 4194                     irony        negative
## 4195              irragularity        negative
## 4196                irrational        negative
## 4197           irrationalities        negative
## 4198             irrationality        negative
## 4199              irrationally        negative
## 4200               irrationals        negative
## 4201            irreconcilable        negative
## 4202             irrecoverable        negative
## 4203         irrecoverableness        negative
## 4204       irrecoverablenesses        negative
## 4205             irrecoverably        negative
## 4206              irredeemable        negative
## 4207              irredeemably        negative
## 4208              irreformable        negative
## 4209                 irregular        negative
## 4210              irregularity        negative
## 4211               irrelevance        negative
## 4212                irrelevant        negative
## 4213               irreparable        negative
## 4214              irreplacible        negative
## 4215             irrepressible        negative
## 4216                irresolute        negative
## 4217              irresolvable        negative
## 4218             irresponsible        negative
## 4219             irresponsibly        negative
## 4220                irretating        negative
## 4221             irretrievable        negative
## 4222              irreversible        negative
## 4223                 irritable        negative
## 4224                 irritably        negative
## 4225                  irritant        negative
## 4226                  irritate        negative
## 4227                 irritated        negative
## 4228                irritating        negative
## 4229                irritation        negative
## 4230               irritations        negative
## 4231                   isolate        negative
## 4232                  isolated        negative
## 4233                 isolation        negative
## 4234                     issue        negative
## 4235                    issues        negative
## 4236                      itch        negative
## 4237                   itching        negative
## 4238                     itchy        negative
## 4239                    jabber        negative
## 4240                     jaded        negative
## 4241                    jagged        negative
## 4242                       jam        negative
## 4243                   jarring        negative
## 4244                 jaundiced        negative
## 4245                   jealous        negative
## 4246                 jealously        negative
## 4247               jealousness        negative
## 4248                  jealousy        negative
## 4249                      jeer        negative
## 4250                   jeering        negative
## 4251                 jeeringly        negative
## 4252                     jeers        negative
## 4253                jeopardize        negative
## 4254                  jeopardy        negative
## 4255                      jerk        negative
## 4256                     jerky        negative
## 4257                    jitter        negative
## 4258                   jitters        negative
## 4259                   jittery        negative
## 4260               job killing        negative
## 4261                   jobless        negative
## 4262                      joke        negative
## 4263                     joker        negative
## 4264                      jolt        negative
## 4265                    judder        negative
## 4266                 juddering        negative
## 4267                   judders        negative
## 4268                     jumpy        negative
## 4269                      junk        negative
## 4270                     junky        negative
## 4271                  junkyard        negative
## 4272                    jutter        negative
## 4273                   jutters        negative
## 4274                     kaput        negative
## 4275                      kill        negative
## 4276                    killed        negative
## 4277                    killer        negative
## 4278                   killing        negative
## 4279                   killjoy        negative
## 4280                     kills        negative
## 4281                     knave        negative
## 4282                     knife        negative
## 4283                     knock        negative
## 4284                   knotted        negative
## 4285                      kook        negative
## 4286                     kooky        negative
## 4287                      lack        negative
## 4288             lackadaisical        negative
## 4289                    lacked        negative
## 4290                    lackey        negative
## 4291                   lackeys        negative
## 4292                   lacking        negative
## 4293                lackluster        negative
## 4294                     lacks        negative
## 4295                   laconic        negative
## 4296                       lag        negative
## 4297                    lagged        negative
## 4298                   lagging        negative
## 4299                     laggy        negative
## 4300                      lags        negative
## 4301                  laid off        negative
## 4302                   lambast        negative
## 4303                  lambaste        negative
## 4304                      lame        negative
## 4305                 lame duck        negative
## 4306                    lament        negative
## 4307                lamentable        negative
## 4308                lamentably        negative
## 4309                   languid        negative
## 4310                  languish        negative
## 4311                   languor        negative
## 4312                languorous        negative
## 4313              languorously        negative
## 4314                     lanky        negative
## 4315                     lapse        negative
## 4316                    lapsed        negative
## 4317                    lapses        negative
## 4318                lascivious        negative
## 4319                last ditch        negative
## 4320                   latency        negative
## 4321                 laughable        negative
## 4322                 laughably        negative
## 4323             laughingstock        negative
## 4324                lawbreaker        negative
## 4325               lawbreaking        negative
## 4326                   lawless        negative
## 4327               lawlessness        negative
## 4328                    layoff        negative
## 4329              layoff happy        negative
## 4330                      lazy        negative
## 4331                      leak        negative
## 4332                   leakage        negative
## 4333                  leakages        negative
## 4334                   leaking        negative
## 4335                     leaks        negative
## 4336                     leaky        negative
## 4337                      lech        negative
## 4338                    lecher        negative
## 4339                 lecherous        negative
## 4340                   lechery        negative
## 4341                     leech        negative
## 4342                      leer        negative
## 4343                     leery        negative
## 4344              left leaning        negative
## 4345                     lemon        negative
## 4346                   lengthy        negative
## 4347            less developed        negative
## 4348              lesser known        negative
## 4349                     letch        negative
## 4350                    lethal        negative
## 4351                 lethargic        negative
## 4352                  lethargy        negative
## 4353                      lewd        negative
## 4354                    lewdly        negative
## 4355                  lewdness        negative
## 4356                 liability        negative
## 4357                    liable        negative
## 4358                      liar        negative
## 4359                     liars        negative
## 4360                licentious        negative
## 4361              licentiously        negative
## 4362            licentiousness        negative
## 4363                       lie        negative
## 4364                      lied        negative
## 4365                      lier        negative
## 4366                      lies        negative
## 4367          life threatening        negative
## 4368                  lifeless        negative
## 4369                     limit        negative
## 4370                limitation        negative
## 4371               limitations        negative
## 4372                   limited        negative
## 4373                    limits        negative
## 4374                      limp        negative
## 4375                  listless        negative
## 4376                 litigious        negative
## 4377              little known        negative
## 4378                     livid        negative
## 4379                   lividly        negative
## 4380                     loath        negative
## 4381                    loathe        negative
## 4382                  loathing        negative
## 4383                   loathly        negative
## 4384                 loathsome        negative
## 4385               loathsomely        negative
## 4386                      lone        negative
## 4387                loneliness        negative
## 4388                    lonely        negative
## 4389                     loner        negative
## 4390                  lonesome        negative
## 4391                 long time        negative
## 4392               long winded        negative
## 4393                   longing        negative
## 4394                 longingly        negative
## 4395                  loophole        negative
## 4396                 loopholes        negative
## 4397                     loose        negative
## 4398                      loot        negative
## 4399                      lorn        negative
## 4400                      lose        negative
## 4401                     loser        negative
## 4402                    losers        negative
## 4403                     loses        negative
## 4404                    losing        negative
## 4405                      loss        negative
## 4406                    losses        negative
## 4407                      lost        negative
## 4408                      loud        negative
## 4409                    louder        negative
## 4410                     lousy        negative
## 4411                  loveless        negative
## 4412                  lovelorn        negative
## 4413                 low rated        negative
## 4414                     lowly        negative
## 4415                 ludicrous        negative
## 4416               ludicrously        negative
## 4417                lugubrious        negative
## 4418                  lukewarm        negative
## 4419                      lull        negative
## 4420                     lumpy        negative
## 4421                   lunatic        negative
## 4422                lunaticism        negative
## 4423                     lurch        negative
## 4424                      lure        negative
## 4425                     lurid        negative
## 4426                      lurk        negative
## 4427                   lurking        negative
## 4428                     lying        negative
## 4429                   macabre        negative
## 4430                       mad        negative
## 4431                    madden        negative
## 4432                 maddening        negative
## 4433               maddeningly        negative
## 4434                    madder        negative
## 4435                     madly        negative
## 4436                    madman        negative
## 4437                   madness        negative
## 4438               maladjusted        negative
## 4439             maladjustment        negative
## 4440                    malady        negative
## 4441                   malaise        negative
## 4442                malcontent        negative
## 4443              malcontented        negative
## 4444                  maledict        negative
## 4445               malevolence        negative
## 4446                malevolent        negative
## 4447              malevolently        negative
## 4448                    malice        negative
## 4449                 malicious        negative
## 4450               maliciously        negative
## 4451             maliciousness        negative
## 4452                    malign        negative
## 4453                 malignant        negative
## 4454                malodorous        negative
## 4455              maltreatment        negative
## 4456                    mangle        negative
## 4457                   mangled        negative
## 4458                   mangles        negative
## 4459                  mangling        negative
## 4460                     mania        negative
## 4461                    maniac        negative
## 4462                  maniacal        negative
## 4463                     manic        negative
## 4464                manipulate        negative
## 4465              manipulation        negative
## 4466              manipulative        negative
## 4467              manipulators        negative
## 4468                       mar        negative
## 4469                  marginal        negative
## 4470                marginally        negative
## 4471                 martyrdom        negative
## 4472         martyrdom seeking        negative
## 4473                    mashed        negative
## 4474                  massacre        negative
## 4475                 massacres        negative
## 4476                     matte        negative
## 4477                   mawkish        negative
## 4478                 mawkishly        negative
## 4479               mawkishness        negative
## 4480                    meager        negative
## 4481               meaningless        negative
## 4482                  meanness        negative
## 4483                    measly        negative
## 4484                    meddle        negative
## 4485                meddlesome        negative
## 4486                  mediocre        negative
## 4487                mediocrity        negative
## 4488                melancholy        negative
## 4489              melodramatic        negative
## 4490          melodramatically        negative
## 4491                  meltdown        negative
## 4492                    menace        negative
## 4493                  menacing        negative
## 4494                menacingly        negative
## 4495                mendacious        negative
## 4496                 mendacity        negative
## 4497                    menial        negative
## 4498                 merciless        negative
## 4499               mercilessly        negative
## 4500                      mess        negative
## 4501                    messed        negative
## 4502                    messes        negative
## 4503                   messing        negative
## 4504                     messy        negative
## 4505                    midget        negative
## 4506                      miff        negative
## 4507                 militancy        negative
## 4508                  mindless        negative
## 4509                mindlessly        negative
## 4510                    mirage        negative
## 4511                      mire        negative
## 4512                  misalign        negative
## 4513                misaligned        negative
## 4514                 misaligns        negative
## 4515              misapprehend        negative
## 4516                 misbecome        negative
## 4517               misbecoming        negative
## 4518               misbegotten        negative
## 4519                 misbehave        negative
## 4520               misbehavior        negative
## 4521              miscalculate        negative
## 4522            miscalculation        negative
## 4523             miscellaneous        negative
## 4524                  mischief        negative
## 4525               mischievous        negative
## 4526             mischievously        negative
## 4527             misconception        negative
## 4528            misconceptions        negative
## 4529                 miscreant        negative
## 4530                miscreants        negative
## 4531              misdirection        negative
## 4532                     miser        negative
## 4533                 miserable        negative
## 4534             miserableness        negative
## 4535                 miserably        negative
## 4536                  miseries        negative
## 4537                   miserly        negative
## 4538                    misery        negative
## 4539                    misfit        negative
## 4540                misfortune        negative
## 4541                 misgiving        negative
## 4542                misgivings        negative
## 4543               misguidance        negative
## 4544                  misguide        negative
## 4545                 misguided        negative
## 4546                 mishandle        negative
## 4547                    mishap        negative
## 4548                 misinform        negative
## 4549               misinformed        negative
## 4550              misinterpret        negative
## 4551                  misjudge        negative
## 4552               misjudgment        negative
## 4553                   mislead        negative
## 4554                misleading        negative
## 4555              misleadingly        negative
## 4556                   mislike        negative
## 4557                 mismanage        negative
## 4558              mispronounce        negative
## 4559             mispronounced        negative
## 4560             mispronounces        negative
## 4561                   misread        negative
## 4562                misreading        negative
## 4563              misrepresent        negative
## 4564         misrepresentation        negative
## 4565                      miss        negative
## 4566                    missed        negative
## 4567                    misses        negative
## 4568              misstatement        negative
## 4569                      mist        negative
## 4570                   mistake        negative
## 4571                  mistaken        negative
## 4572                mistakenly        negative
## 4573                  mistakes        negative
## 4574                 mistified        negative
## 4575                  mistress        negative
## 4576                  mistrust        negative
## 4577               mistrustful        negative
## 4578             mistrustfully        negative
## 4579                     mists        negative
## 4580             misunderstand        negative
## 4581          misunderstanding        negative
## 4582         misunderstandings        negative
## 4583             misunderstood        negative
## 4584                    misuse        negative
## 4585                      moan        negative
## 4586                   mobster        negative
## 4587                      mock        negative
## 4588                    mocked        negative
## 4589                 mockeries        negative
## 4590                   mockery        negative
## 4591                   mocking        negative
## 4592                 mockingly        negative
## 4593                     mocks        negative
## 4594                    molest        negative
## 4595               molestation        negative
## 4596                monotonous        negative
## 4597                  monotony        negative
## 4598                   monster        negative
## 4599             monstrosities        negative
## 4600               monstrosity        negative
## 4601                 monstrous        negative
## 4602               monstrously        negative
## 4603                     moody        negative
## 4604                      moot        negative
## 4605                      mope        negative
## 4606                    morbid        negative
## 4607                  morbidly        negative
## 4608                   mordant        negative
## 4609                 mordantly        negative
## 4610                  moribund        negative
## 4611                     moron        negative
## 4612                   moronic        negative
## 4613                    morons        negative
## 4614             mortification        negative
## 4615                 mortified        negative
## 4616                   mortify        negative
## 4617                mortifying        negative
## 4618                motionless        negative
## 4619                    motley        negative
## 4620                     mourn        negative
## 4621                   mourner        negative
## 4622                  mournful        negative
## 4623                mournfully        negative
## 4624                    muddle        negative
## 4625                     muddy        negative
## 4626                mudslinger        negative
## 4627               mudslinging        negative
## 4628                    mulish        negative
## 4629        multi polarization        negative
## 4630                   mundane        negative
## 4631                    murder        negative
## 4632                  murderer        negative
## 4633                 murderous        negative
## 4634               murderously        negative
## 4635                     murky        negative
## 4636            muscle flexing        negative
## 4637                     mushy        negative
## 4638                     musty        negative
## 4639                mysterious        negative
## 4640              mysteriously        negative
## 4641                   mystery        negative
## 4642                   mystify        negative
## 4643                      myth        negative
## 4644                       nag        negative
## 4645                   nagging        negative
## 4646                     naive        negative
## 4647                   naively        negative
## 4648                  narrower        negative
## 4649                   nastily        negative
## 4650                 nastiness        negative
## 4651                     nasty        negative
## 4652                   naughty        negative
## 4653                  nauseate        negative
## 4654                 nauseates        negative
## 4655                nauseating        negative
## 4656              nauseatingly        negative
## 4657                  nebulous        negative
## 4658                nebulously        negative
## 4659                  needless        negative
## 4660                needlessly        negative
## 4661                     needy        negative
## 4662                 nefarious        negative
## 4663               nefariously        negative
## 4664                    negate        negative
## 4665                  negation        negative
## 4666                  negative        negative
## 4667                 negatives        negative
## 4668                negativity        negative
## 4669                   neglect        negative
## 4670                 neglected        negative
## 4671                negligence        negative
## 4672                 negligent        negative
## 4673                   nemesis        negative
## 4674                  nepotism        negative
## 4675                   nervous        negative
## 4676                 nervously        negative
## 4677               nervousness        negative
## 4678                    nettle        negative
## 4679                nettlesome        negative
## 4680                  neurotic        negative
## 4681              neurotically        negative
## 4682                    niggle        negative
## 4683                   niggles        negative
## 4684                 nightmare        negative
## 4685               nightmarish        negative
## 4686             nightmarishly        negative
## 4687                   nitpick        negative
## 4688                nitpicking        negative
## 4689                     noise        negative
## 4690                    noises        negative
## 4691                   noisier        negative
## 4692                     noisy        negative
## 4693            non confidence        negative
## 4694               nonexistent        negative
## 4695             nonresponsive        negative
## 4696                  nonsense        negative
## 4697                     nosey        negative
## 4698                 notoriety        negative
## 4699                 notorious        negative
## 4700               notoriously        negative
## 4701                   noxious        negative
## 4702                  nuisance        negative
## 4703                      numb        negative
## 4704                     obese        negative
## 4705                    object        negative
## 4706                 objection        negative
## 4707             objectionable        negative
## 4708                objections        negative
## 4709                   oblique        negative
## 4710                obliterate        negative
## 4711               obliterated        negative
## 4712                 oblivious        negative
## 4713                 obnoxious        negative
## 4714               obnoxiously        negative
## 4715                   obscene        negative
## 4716                 obscenely        negative
## 4717                 obscenity        negative
## 4718                   obscure        negative
## 4719                  obscured        negative
## 4720                  obscures        negative
## 4721                 obscurity        negative
## 4722                    obsess        negative
## 4723                 obsessive        negative
## 4724               obsessively        negative
## 4725             obsessiveness        negative
## 4726                  obsolete        negative
## 4727                  obstacle        negative
## 4728                 obstinate        negative
## 4729               obstinately        negative
## 4730                  obstruct        negative
## 4731                obstructed        negative
## 4732               obstructing        negative
## 4733               obstruction        negative
## 4734                 obstructs        negative
## 4735                 obtrusive        negative
## 4736                    obtuse        negative
## 4737                   occlude        negative
## 4738                  occluded        negative
## 4739                  occludes        negative
## 4740                 occluding        negative
## 4741                       odd        negative
## 4742                     odder        negative
## 4743                    oddest        negative
## 4744                  oddities        negative
## 4745                    oddity        negative
## 4746                     oddly        negative
## 4747                      odor        negative
## 4748                   offence        negative
## 4749                    offend        negative
## 4750                  offender        negative
## 4751                 offending        negative
## 4752                  offenses        negative
## 4753                 offensive        negative
## 4754               offensively        negative
## 4755             offensiveness        negative
## 4756                 officious        negative
## 4757                   ominous        negative
## 4758                 ominously        negative
## 4759                  omission        negative
## 4760                      omit        negative
## 4761                 one sided        negative
## 4762                   onerous        negative
## 4763                 onerously        negative
## 4764                 onslaught        negative
## 4765               opinionated        negative
## 4766                  opponent        negative
## 4767             opportunistic        negative
## 4768                    oppose        negative
## 4769                opposition        negative
## 4770               oppositions        negative
## 4771                   oppress        negative
## 4772                oppression        negative
## 4773                oppressive        negative
## 4774              oppressively        negative
## 4775            oppressiveness        negative
## 4776                oppressors        negative
## 4777                    ordeal        negative
## 4778                    orphan        negative
## 4779                 ostracize        negative
## 4780                  outbreak        negative
## 4781                  outburst        negative
## 4782                 outbursts        negative
## 4783                   outcast        negative
## 4784                    outcry        negative
## 4785                    outlaw        negative
## 4786                  outmoded        negative
## 4787                   outrage        negative
## 4788                  outraged        negative
## 4789                outrageous        negative
## 4790              outrageously        negative
## 4791            outrageousness        negative
## 4792                  outrages        negative
## 4793                  outsider        negative
## 4794                over acted        negative
## 4795                  over awe        negative
## 4796             over balanced        negative
## 4797                over hyped        negative
## 4798               over priced        negative
## 4799            over valuation        negative
## 4800                   overact        negative
## 4801                 overacted        negative
## 4802                   overawe        negative
## 4803               overbalance        negative
## 4804              overbalanced        negative
## 4805               overbearing        negative
## 4806             overbearingly        negative
## 4807                 overblown        negative
## 4808                    overdo        negative
## 4809                  overdone        negative
## 4810                   overdue        negative
## 4811             overemphasize        negative
## 4812                  overheat        negative
## 4813                  overkill        negative
## 4814                overloaded        negative
## 4815                  overlook        negative
## 4816                  overpaid        negative
## 4817                 overpayed        negative
## 4818                  overplay        negative
## 4819                 overpower        negative
## 4820                overpriced        negative
## 4821                 overrated        negative
## 4822                 overreach        negative
## 4823                   overrun        negative
## 4824                overshadow        negative
## 4825                 oversight        negative
## 4826                oversights        negative
## 4827        oversimplification        negative
## 4828            oversimplified        negative
## 4829              oversimplify        negative
## 4830                  oversize        negative
## 4831                 overstate        negative
## 4832                overstated        negative
## 4833             overstatement        negative
## 4834            overstatements        negative
## 4835                overstates        negative
## 4836                 overtaxed        negative
## 4837                 overthrow        negative
## 4838                overthrows        negative
## 4839                  overturn        negative
## 4840                overweight        negative
## 4841                 overwhelm        negative
## 4842               overwhelmed        negative
## 4843              overwhelming        negative
## 4844            overwhelmingly        negative
## 4845                overwhelms        negative
## 4846               overzealous        negative
## 4847             overzealously        negative
## 4848                overzelous        negative
## 4849                      pain        negative
## 4850                   painful        negative
## 4851                  painfull        negative
## 4852                 painfully        negative
## 4853                     pains        negative
## 4854                      pale        negative
## 4855                     pales        negative
## 4856                    paltry        negative
## 4857                       pan        negative
## 4858               pandemonium        negative
## 4859                    pander        negative
## 4860                 pandering        negative
## 4861                   panders        negative
## 4862                     panic        negative
## 4863                    panick        negative
## 4864                  panicked        negative
## 4865                 panicking        negative
## 4866                   panicky        negative
## 4867               paradoxical        negative
## 4868             paradoxically        negative
## 4869                  paralize        negative
## 4870                 paralyzed        negative
## 4871                  paranoia        negative
## 4872                  paranoid        negative
## 4873                  parasite        negative
## 4874                    pariah        negative
## 4875                    parody        negative
## 4876                partiality        negative
## 4877                  partisan        negative
## 4878                 partisans        negative
## 4879                     passe        negative
## 4880                   passive        negative
## 4881               passiveness        negative
## 4882                  pathetic        negative
## 4883              pathetically        negative
## 4884                 patronize        negative
## 4885                   paucity        negative
## 4886                    pauper        negative
## 4887                   paupers        negative
## 4888                   payback        negative
## 4889                  peculiar        negative
## 4890                peculiarly        negative
## 4891                  pedantic        negative
## 4892                    peeled        negative
## 4893                     peeve        negative
## 4894                    peeved        negative
## 4895                   peevish        negative
## 4896                 peevishly        negative
## 4897                  penalize        negative
## 4898                   penalty        negative
## 4899                perfidious        negative
## 4900                 perfidity        negative
## 4901               perfunctory        negative
## 4902                     peril        negative
## 4903                  perilous        negative
## 4904                perilously        negative
## 4905                    perish        negative
## 4906                pernicious        negative
## 4907                   perplex        negative
## 4908                 perplexed        negative
## 4909                perplexing        negative
## 4910                perplexity        negative
## 4911                 persecute        negative
## 4912               persecution        negative
## 4913              pertinacious        negative
## 4914            pertinaciously        negative
## 4915               pertinacity        negative
## 4916                   perturb        negative
## 4917                 perturbed        negative
## 4918                 pervasive        negative
## 4919                  perverse        negative
## 4920                perversely        negative
## 4921                perversion        negative
## 4922                perversity        negative
## 4923                   pervert        negative
## 4924                 perverted        negative
## 4925                  perverts        negative
## 4926                 pessimism        negative
## 4927               pessimistic        negative
## 4928           pessimistically        negative
## 4929                      pest        negative
## 4930                 pestilent        negative
## 4931                 petrified        negative
## 4932                   petrify        negative
## 4933                  pettifog        negative
## 4934                     petty        negative
## 4935                    phobia        negative
## 4936                    phobic        negative
## 4937                     phony        negative
## 4938                    picket        negative
## 4939                  picketed        negative
## 4940                 picketing        negative
## 4941                   pickets        negative
## 4942                     picky        negative
## 4943                       pig        negative
## 4944                      pigs        negative
## 4945                   pillage        negative
## 4946                   pillory        negative
## 4947                    pimple        negative
## 4948                     pinch        negative
## 4949                     pique        negative
## 4950                  pitiable        negative
## 4951                   pitiful        negative
## 4952                 pitifully        negative
## 4953                  pitiless        negative
## 4954                pitilessly        negative
## 4955                  pittance        negative
## 4956                      pity        negative
## 4957                plagiarize        negative
## 4958                    plague        negative
## 4959                 plasticky        negative
## 4960                 plaything        negative
## 4961                      plea        negative
## 4962                     pleas        negative
## 4963                  plebeian        negative
## 4964                    plight        negative
## 4965                      plot        negative
## 4966                  plotters        negative
## 4967                      ploy        negative
## 4968                   plunder        negative
## 4969                 plunderer        negative
## 4970                 pointless        negative
## 4971               pointlessly        negative
## 4972                    poison        negative
## 4973                 poisonous        negative
## 4974               poisonously        negative
## 4975                     pokey        negative
## 4976                      poky        negative
## 4977              polarisation        negative
## 4978                  polemize        negative
## 4979                   pollute        negative
## 4980                  polluter        negative
## 4981                 polluters        negative
## 4982                  polution        negative
## 4983                   pompous        negative
## 4984                      poor        negative
## 4985                    poorer        negative
## 4986                   poorest        negative
## 4987                    poorly        negative
## 4988                 posturing        negative
## 4989                      pout        negative
## 4990                   poverty        negative
## 4991                 powerless        negative
## 4992                     prate        negative
## 4993                  pratfall        negative
## 4994                   prattle        negative
## 4995                precarious        negative
## 4996              precariously        negative
## 4997               precipitate        negative
## 4998               precipitous        negative
## 4999                 predatory        negative
## 5000               predicament        negative
## 5001                  prejudge        negative
## 5002                 prejudice        negative
## 5003                prejudices        negative
## 5004               prejudicial        negative
## 5005              premeditated        negative
## 5006                 preoccupy        negative
## 5007              preposterous        negative
## 5008            preposterously        negative
## 5009              presumptuous        negative
## 5010            presumptuously        negative
## 5011                  pretence        negative
## 5012                   pretend        negative
## 5013                  pretense        negative
## 5014               pretentious        negative
## 5015             pretentiously        negative
## 5016               prevaricate        negative
## 5017                    pricey        negative
## 5018                   pricier        negative
## 5019                     prick        negative
## 5020                   prickle        negative
## 5021                  prickles        negative
## 5022                  prideful        negative
## 5023                      prik        negative
## 5024                 primitive        negative
## 5025                    prison        negative
## 5026                  prisoner        negative
## 5027                   problem        negative
## 5028               problematic        negative
## 5029                  problems        negative
## 5030             procrastinate        negative
## 5031            procrastinates        negative
## 5032           procrastination        negative
## 5033                   profane        negative
## 5034                 profanity        negative
## 5035                  prohibit        negative
## 5036               prohibitive        negative
## 5037             prohibitively        negative
## 5038                propaganda        negative
## 5039              propagandize        negative
## 5040               proprietary        negative
## 5041                 prosecute        negative
## 5042                   protest        negative
## 5043                 protested        negative
## 5044                protesting        negative
## 5045                  protests        negative
## 5046                protracted        negative
## 5047               provocation        negative
## 5048               provocative        negative
## 5049                   provoke        negative
## 5050                       pry        negative
## 5051                pugnacious        negative
## 5052              pugnaciously        negative
## 5053                 pugnacity        negative
## 5054                     punch        negative
## 5055                    punish        negative
## 5056                punishable        negative
## 5057                  punitive        negative
## 5058                      punk        negative
## 5059                      puny        negative
## 5060                    puppet        negative
## 5061                   puppets        negative
## 5062                   puzzled        negative
## 5063                puzzlement        negative
## 5064                  puzzling        negative
## 5065                     quack        negative
## 5066                     qualm        negative
## 5067                    qualms        negative
## 5068                  quandary        negative
## 5069                   quarrel        negative
## 5070               quarrellous        negative
## 5071             quarrellously        negative
## 5072                  quarrels        negative
## 5073               quarrelsome        negative
## 5074                     quash        negative
## 5075                     queer        negative
## 5076              questionable        negative
## 5077                   quibble        negative
## 5078                  quibbles        negative
## 5079                   quitter        negative
## 5080                     rabid        negative
## 5081                    racism        negative
## 5082                    racist        negative
## 5083                   racists        negative
## 5084                      racy        negative
## 5085                   radical        negative
## 5086            radicalization        negative
## 5087                 radically        negative
## 5088                  radicals        negative
## 5089                      rage        negative
## 5090                    ragged        negative
## 5091                    raging        negative
## 5092                      rail        negative
## 5093                     raked        negative
## 5094                   rampage        negative
## 5095                   rampant        negative
## 5096                ramshackle        negative
## 5097                    rancor        negative
## 5098                  randomly        negative
## 5099                    rankle        negative
## 5100                      rant        negative
## 5101                    ranted        negative
## 5102                   ranting        negative
## 5103                 rantingly        negative
## 5104                     rants        negative
## 5105                      rape        negative
## 5106                     raped        negative
## 5107                    raping        negative
## 5108                    rascal        negative
## 5109                   rascals        negative
## 5110                      rash        negative
## 5111                    rattle        negative
## 5112                   rattled        negative
## 5113                   rattles        negative
## 5114                    ravage        negative
## 5115                    raving        negative
## 5116               reactionary        negative
## 5117                rebellious        negative
## 5118                    rebuff        negative
## 5119                    rebuke        negative
## 5120              recalcitrant        negative
## 5121                    recant        negative
## 5122                 recession        negative
## 5123              recessionary        negative
## 5124                  reckless        negative
## 5125                recklessly        negative
## 5126              recklessness        negative
## 5127                    recoil        negative
## 5128                 recourses        negative
## 5129                redundancy        negative
## 5130                 redundant        negative
## 5131                   refusal        negative
## 5132                    refuse        negative
## 5133                   refused        negative
## 5134                   refuses        negative
## 5135                  refusing        negative
## 5136                refutation        negative
## 5137                    refute        negative
## 5138                   refuted        negative
## 5139                   refutes        negative
## 5140                  refuting        negative
## 5141                   regress        negative
## 5142                regression        negative
## 5143                regressive        negative
## 5144                    regret        negative
## 5145                  regreted        negative
## 5146                 regretful        negative
## 5147               regretfully        negative
## 5148                   regrets        negative
## 5149               regrettable        negative
## 5150               regrettably        negative
## 5151                 regretted        negative
## 5152                    reject        negative
## 5153                  rejected        negative
## 5154                 rejecting        negative
## 5155                 rejection        negative
## 5156                   rejects        negative
## 5157                   relapse        negative
## 5158                relentless        negative
## 5159              relentlessly        negative
## 5160            relentlessness        negative
## 5161                reluctance        negative
## 5162                 reluctant        negative
## 5163               reluctantly        negative
## 5164                   remorse        negative
## 5165                remorseful        negative
## 5166              remorsefully        negative
## 5167               remorseless        negative
## 5168             remorselessly        negative
## 5169           remorselessness        negative
## 5170                  renounce        negative
## 5171              renunciation        negative
## 5172                     repel        negative
## 5173                repetitive        negative
## 5174             reprehensible        negative
## 5175             reprehensibly        negative
## 5176              reprehension        negative
## 5177              reprehensive        negative
## 5178                   repress        negative
## 5179                repression        negative
## 5180                repressive        negative
## 5181                 reprimand        negative
## 5182                  reproach        negative
## 5183               reproachful        negative
## 5184                   reprove        negative
## 5185               reprovingly        negative
## 5186                 repudiate        negative
## 5187               repudiation        negative
## 5188                    repugn        negative
## 5189                repugnance        negative
## 5190                 repugnant        negative
## 5191               repugnantly        negative
## 5192                   repulse        negative
## 5193                  repulsed        negative
## 5194                 repulsing        negative
## 5195                 repulsive        negative
## 5196               repulsively        negative
## 5197             repulsiveness        negative
## 5198                    resent        negative
## 5199                 resentful        negative
## 5200                resentment        negative
## 5201               resignation        negative
## 5202                  resigned        negative
## 5203                resistance        negative
## 5204                  restless        negative
## 5205              restlessness        negative
## 5206                  restrict        negative
## 5207                restricted        negative
## 5208               restriction        negative
## 5209               restrictive        negative
## 5210                 resurgent        negative
## 5211                 retaliate        negative
## 5212               retaliatory        negative
## 5213                    retard        negative
## 5214                  retarded        negative
## 5215              retardedness        negative
## 5216                   retards        negative
## 5217                  reticent        negative
## 5218                   retract        negative
## 5219                   retreat        negative
## 5220                 retreated        negative
## 5221                   revenge        negative
## 5222                revengeful        negative
## 5223              revengefully        negative
## 5224                    revert        negative
## 5225                    revile        negative
## 5226                   reviled        negative
## 5227                    revoke        negative
## 5228                    revolt        negative
## 5229                 revolting        negative
## 5230               revoltingly        negative
## 5231                 revulsion        negative
## 5232                 revulsive        negative
## 5233                rhapsodize        negative
## 5234                  rhetoric        negative
## 5235                rhetorical        negative
## 5236                     ricer        negative
## 5237                  ridicule        negative
## 5238                 ridicules        negative
## 5239                ridiculous        negative
## 5240              ridiculously        negative
## 5241                      rife        negative
## 5242                      rift        negative
## 5243                     rifts        negative
## 5244                     rigid        negative
## 5245                  rigidity        negative
## 5246                 rigidness        negative
## 5247                      rile        negative
## 5248                     riled        negative
## 5249                       rip        negative
## 5250                   rip off        negative
## 5251                    ripoff        negative
## 5252                    ripped        negative
## 5253                      risk        negative
## 5254                     risks        negative
## 5255                     risky        negative
## 5256                     rival        negative
## 5257                   rivalry        negative
## 5258                roadblocks        negative
## 5259                     rocky        negative
## 5260                     rogue        negative
## 5261             rollercoaster        negative
## 5262                       rot        negative
## 5263                    rotten        negative
## 5264                     rough        negative
## 5265               rremediable        negative
## 5266                   rubbish        negative
## 5267                      rude        negative
## 5268                       rue        negative
## 5269                   ruffian        negative
## 5270                    ruffle        negative
## 5271                      ruin        negative
## 5272                    ruined        negative
## 5273                   ruining        negative
## 5274                   ruinous        negative
## 5275                     ruins        negative
## 5276                  rumbling        negative
## 5277                     rumor        negative
## 5278                    rumors        negative
## 5279                   rumours        negative
## 5280                    rumple        negative
## 5281                  run down        negative
## 5282                   runaway        negative
## 5283                   rupture        negative
## 5284                      rust        negative
## 5285                     rusts        negative
## 5286                     rusty        negative
## 5287                       rut        negative
## 5288                  ruthless        negative
## 5289                ruthlessly        negative
## 5290              ruthlessness        negative
## 5291                      ruts        negative
## 5292                  sabotage        negative
## 5293                      sack        negative
## 5294                sacrificed        negative
## 5295                       sad        negative
## 5296                    sadden        negative
## 5297                     sadly        negative
## 5298                   sadness        negative
## 5299                       sag        negative
## 5300                    sagged        negative
## 5301                   sagging        negative
## 5302                     saggy        negative
## 5303                      sags        negative
## 5304                 salacious        negative
## 5305             sanctimonious        negative
## 5306                       sap        negative
## 5307                   sarcasm        negative
## 5308                 sarcastic        negative
## 5309             sarcastically        negative
## 5310                  sardonic        negative
## 5311              sardonically        negative
## 5312                      sass        negative
## 5313                 satirical        negative
## 5314                  satirize        negative
## 5315                    savage        negative
## 5316                   savaged        negative
## 5317                  savagery        negative
## 5318                   savages        negative
## 5319                     scaly        negative
## 5320                      scam        negative
## 5321                     scams        negative
## 5322                   scandal        negative
## 5323                scandalize        negative
## 5324               scandalized        negative
## 5325                scandalous        negative
## 5326              scandalously        negative
## 5327                  scandals        negative
## 5328                   scandel        negative
## 5329                  scandels        negative
## 5330                     scant        negative
## 5331                 scapegoat        negative
## 5332                      scar        negative
## 5333                    scarce        negative
## 5334                  scarcely        negative
## 5335                  scarcity        negative
## 5336                     scare        negative
## 5337                    scared        negative
## 5338                   scarier        negative
## 5339                  scariest        negative
## 5340                   scarily        negative
## 5341                   scarred        negative
## 5342                     scars        negative
## 5343                     scary        negative
## 5344                  scathing        negative
## 5345                scathingly        negative
## 5346                 sceptical        negative
## 5347                     scoff        negative
## 5348                scoffingly        negative
## 5349                     scold        negative
## 5350                   scolded        negative
## 5351                  scolding        negative
## 5352                scoldingly        negative
## 5353                 scorching        negative
## 5354               scorchingly        negative
## 5355                     scorn        negative
## 5356                  scornful        negative
## 5357                scornfully        negative
## 5358                 scoundrel        negative
## 5359                   scourge        negative
## 5360                     scowl        negative
## 5361                  scramble        negative
## 5362                 scrambled        negative
## 5363                 scrambles        negative
## 5364                scrambling        negative
## 5365                     scrap        negative
## 5366                   scratch        negative
## 5367                 scratched        negative
## 5368                 scratches        negative
## 5369                  scratchy        negative
## 5370                    scream        negative
## 5371                   screech        negative
## 5372                  screw up        negative
## 5373                   screwed        negative
## 5374                screwed up        negative
## 5375                    screwy        negative
## 5376                     scuff        negative
## 5377                    scuffs        negative
## 5378                      scum        negative
## 5379                    scummy        negative
## 5380              second class        negative
## 5381               second tier        negative
## 5382                 secretive        negative
## 5383                 sedentary        negative
## 5384                     seedy        negative
## 5385                    seethe        negative
## 5386                  seething        negative
## 5387                 self coup        negative
## 5388            self criticism        negative
## 5389            self defeating        negative
## 5390          self destructive        negative
## 5391          self humiliation        negative
## 5392             self interest        negative
## 5393           self interested        negative
## 5394              self serving        negative
## 5395            selfinterested        negative
## 5396                   selfish        negative
## 5397                 selfishly        negative
## 5398               selfishness        negative
## 5399             semi retarded        negative
## 5400                    senile        negative
## 5401            sensationalize        negative
## 5402                 senseless        negative
## 5403               senselessly        negative
## 5404               seriousness        negative
## 5405                 sermonize        negative
## 5406                 servitude        negative
## 5407                    set up        negative
## 5408                   setback        negative
## 5409                  setbacks        negative
## 5410                     sever        negative
## 5411                    severe        negative
## 5412                  severity        negative
## 5413                    shabby        negative
## 5414                   shadowy        negative
## 5415                     shady        negative
## 5416                     shake        negative
## 5417                     shaky        negative
## 5418                   shallow        negative
## 5419                      sham        negative
## 5420                  shambles        negative
## 5421                     shame        negative
## 5422                  shameful        negative
## 5423                shamefully        negative
## 5424              shamefulness        negative
## 5425                 shameless        negative
## 5426               shamelessly        negative
## 5427             shamelessness        negative
## 5428                     shark        negative
## 5429                   sharply        negative
## 5430                   shatter        negative
## 5431                   shemale        negative
## 5432                   shimmer        negative
## 5433                    shimmy        negative
## 5434                 shipwreck        negative
## 5435                     shirk        negative
## 5436                   shirker        negative
## 5437                      shit        negative
## 5438                    shiver        negative
## 5439                     shock        negative
## 5440                   shocked        negative
## 5441                  shocking        negative
## 5442                shockingly        negative
## 5443                    shoddy        negative
## 5444               short lived        negative
## 5445                  shortage        negative
## 5446               shortchange        negative
## 5447               shortcoming        negative
## 5448              shortcomings        negative
## 5449                 shortness        negative
## 5450              shortsighted        negative
## 5451          shortsightedness        negative
## 5452                  showdown        negative
## 5453                     shrew        negative
## 5454                    shriek        negative
## 5455                    shrill        negative
## 5456                   shrilly        negative
## 5457                   shrivel        negative
## 5458                    shroud        negative
## 5459                  shrouded        negative
## 5460                     shrug        negative
## 5461                      shun        negative
## 5462                   shunned        negative
## 5463                      sick        negative
## 5464                    sicken        negative
## 5465                 sickening        negative
## 5466               sickeningly        negative
## 5467                    sickly        negative
## 5468                  sickness        negative
## 5469                 sidetrack        negative
## 5470               sidetracked        negative
## 5471                     siege        negative
## 5472                   sillily        negative
## 5473                     silly        negative
## 5474                simplistic        negative
## 5475            simplistically        negative
## 5476                       sin        negative
## 5477                    sinful        negative
## 5478                  sinfully        negative
## 5479                  sinister        negative
## 5480                sinisterly        negative
## 5481                      sink        negative
## 5482                   sinking        negative
## 5483                 skeletons        negative
## 5484                   skeptic        negative
## 5485                 skeptical        negative
## 5486               skeptically        negative
## 5487                skepticism        negative
## 5488                   sketchy        negative
## 5489                    skimpy        negative
## 5490                    skinny        negative
## 5491                  skittish        negative
## 5492                skittishly        negative
## 5493                     skulk        negative
## 5494                     slack        negative
## 5495                   slander        negative
## 5496                 slanderer        negative
## 5497                slanderous        negative
## 5498              slanderously        negative
## 5499                  slanders        negative
## 5500                      slap        negative
## 5501                  slashing        negative
## 5502                 slaughter        negative
## 5503               slaughtered        negative
## 5504                     slave        negative
## 5505                    slaves        negative
## 5506                    sleazy        negative
## 5507                     slime        negative
## 5508                      slog        negative
## 5509                   slogged        negative
## 5510                  slogging        negative
## 5511                     slogs        negative
## 5512         sloooooooooooooow        negative
## 5513                   sloooow        negative
## 5514                    slooow        negative
## 5515                     sloow        negative
## 5516                  sloppily        negative
## 5517                    sloppy        negative
## 5518                     sloth        negative
## 5519                  slothful        negative
## 5520                      slow        negative
## 5521               slow moving        negative
## 5522                    slowed        negative
## 5523                    slower        negative
## 5524                   slowest        negative
## 5525                    slowly        negative
## 5526                     sloww        negative
## 5527                    slowww        negative
## 5528                   slowwww        negative
## 5529                      slug        negative
## 5530                  sluggish        negative
## 5531                     slump        negative
## 5532                  slumping        negative
## 5533                 slumpping        negative
## 5534                      slur        negative
## 5535                      slut        negative
## 5536                     sluts        negative
## 5537                       sly        negative
## 5538                     smack        negative
## 5539                  smallish        negative
## 5540                     smash        negative
## 5541                     smear        negative
## 5542                     smell        negative
## 5543                   smelled        negative
## 5544                  smelling        negative
## 5545                    smells        negative
## 5546                    smelly        negative
## 5547                     smelt        negative
## 5548                     smoke        negative
## 5549               smokescreen        negative
## 5550                   smolder        negative
## 5551                smoldering        negative
## 5552                   smother        negative
## 5553                  smoulder        negative
## 5554               smouldering        negative
## 5555                    smudge        negative
## 5556                   smudged        negative
## 5557                   smudges        negative
## 5558                  smudging        negative
## 5559                      smug        negative
## 5560                    smugly        negative
## 5561                      smut        negative
## 5562                  smuttier        negative
## 5563                 smuttiest        negative
## 5564                    smutty        negative
## 5565                      snag        negative
## 5566                   snagged        negative
## 5567                  snagging        negative
## 5568                     snags        negative
## 5569                  snappish        negative
## 5570                snappishly        negative
## 5571                     snare        negative
## 5572                    snarky        negative
## 5573                     snarl        negative
## 5574                     sneak        negative
## 5575                  sneakily        negative
## 5576                    sneaky        negative
## 5577                     sneer        negative
## 5578                  sneering        negative
## 5579                sneeringly        negative
## 5580                      snob        negative
## 5581                  snobbish        negative
## 5582                    snobby        negative
## 5583                   snobish        negative
## 5584                     snobs        negative
## 5585                      snub        negative
## 5586                    so cal        negative
## 5587                     soapy        negative
## 5588                       sob        negative
## 5589                     sober        negative
## 5590                  sobering        negative
## 5591                    solemn        negative
## 5592                solicitude        negative
## 5593                    somber        negative
## 5594                      sore        negative
## 5595                    sorely        negative
## 5596                  soreness        negative
## 5597                    sorrow        negative
## 5598                 sorrowful        negative
## 5599               sorrowfully        negative
## 5600                     sorry        negative
## 5601                      sour        negative
## 5602                    sourly        negative
## 5603                     spade        negative
## 5604                     spank        negative
## 5605                    spendy        negative
## 5606                      spew        negative
## 5607                    spewed        negative
## 5608                   spewing        negative
## 5609                     spews        negative
## 5610                  spilling        negative
## 5611                  spinster        negative
## 5612                spiritless        negative
## 5613                     spite        negative
## 5614                  spiteful        negative
## 5615                spitefully        negative
## 5616              spitefulness        negative
## 5617                  splatter        negative
## 5618                     split        negative
## 5619                 splitting        negative
## 5620                     spoil        negative
## 5621                  spoilage        negative
## 5622                 spoilages        negative
## 5623                   spoiled        negative
## 5624                  spoilled        negative
## 5625                    spoils        negative
## 5626                     spook        negative
## 5627                  spookier        negative
## 5628                 spookiest        negative
## 5629                  spookily        negative
## 5630                    spooky        negative
## 5631                 spoon fed        negative
## 5632                spoon feed        negative
## 5633                  spoonfed        negative
## 5634                  sporadic        negative
## 5635                    spotty        negative
## 5636                  spurious        negative
## 5637                     spurn        negative
## 5638                   sputter        negative
## 5639                  squabble        negative
## 5640                squabbling        negative
## 5641                  squander        negative
## 5642                    squash        negative
## 5643                    squeak        negative
## 5644                   squeaks        negative
## 5645                   squeaky        negative
## 5646                    squeal        negative
## 5647                 squealing        negative
## 5648                   squeals        negative
## 5649                    squirm        negative
## 5650                      stab        negative
## 5651                  stagnant        negative
## 5652                  stagnate        negative
## 5653                stagnation        negative
## 5654                     staid        negative
## 5655                     stain        negative
## 5656                    stains        negative
## 5657                     stale        negative
## 5658                 stalemate        negative
## 5659                     stall        negative
## 5660                    stalls        negative
## 5661                   stammer        negative
## 5662                  stampede        negative
## 5663                standstill        negative
## 5664                     stark        negative
## 5665                   starkly        negative
## 5666                   startle        negative
## 5667                 startling        negative
## 5668               startlingly        negative
## 5669                starvation        negative
## 5670                    starve        negative
## 5671                    static        negative
## 5672                     steal        negative
## 5673                  stealing        negative
## 5674                    steals        negative
## 5675                     steep        negative
## 5676                   steeply        negative
## 5677                    stench        negative
## 5678                stereotype        negative
## 5679             stereotypical        negative
## 5680           stereotypically        negative
## 5681                     stern        negative
## 5682                      stew        negative
## 5683                    sticky        negative
## 5684                     stiff        negative
## 5685                 stiffness        negative
## 5686                    stifle        negative
## 5687                  stifling        negative
## 5688                stiflingly        negative
## 5689                    stigma        negative
## 5690                stigmatize        negative
## 5691                     sting        negative
## 5692                  stinging        negative
## 5693                stingingly        negative
## 5694                    stingy        negative
## 5695                     stink        negative
## 5696                    stinks        negative
## 5697                    stodgy        negative
## 5698                     stole        negative
## 5699                    stolen        negative
## 5700                    stooge        negative
## 5701                   stooges        negative
## 5702                    stormy        negative
## 5703                  straggle        negative
## 5704                 straggler        negative
## 5705                    strain        negative
## 5706                  strained        negative
## 5707                 straining        negative
## 5708                   strange        negative
## 5709                 strangely        negative
## 5710                  stranger        negative
## 5711                 strangest        negative
## 5712                  strangle        negative
## 5713                   streaky        negative
## 5714                 strenuous        negative
## 5715                    stress        negative
## 5716                  stresses        negative
## 5717                 stressful        negative
## 5718               stressfully        negative
## 5719                  stricken        negative
## 5720                    strict        negative
## 5721                  strictly        negative
## 5722                  strident        negative
## 5723                stridently        negative
## 5724                    strife        negative
## 5725                    strike        negative
## 5726                 stringent        negative
## 5727               stringently        negative
## 5728                    struck        negative
## 5729                  struggle        negative
## 5730                 struggled        negative
## 5731                 struggles        negative
## 5732                struggling        negative
## 5733                     strut        negative
## 5734                  stubborn        negative
## 5735                stubbornly        negative
## 5736              stubbornness        negative
## 5737                     stuck        negative
## 5738                    stuffy        negative
## 5739                   stumble        negative
## 5740                  stumbled        negative
## 5741                  stumbles        negative
## 5742                     stump        negative
## 5743                   stumped        negative
## 5744                    stumps        negative
## 5745                      stun        negative
## 5746                     stunt        negative
## 5747                   stunted        negative
## 5748                    stupid        negative
## 5749                 stupidest        negative
## 5750                 stupidity        negative
## 5751                  stupidly        negative
## 5752                 stupified        negative
## 5753                   stupify        negative
## 5754                    stupor        negative
## 5755                   stutter        negative
## 5756                 stuttered        negative
## 5757                stuttering        negative
## 5758                  stutters        negative
## 5759                       sty        negative
## 5760                   stymied        negative
## 5761                   sub par        negative
## 5762                   subdued        negative
## 5763                 subjected        negative
## 5764                subjection        negative
## 5765                 subjugate        negative
## 5766               subjugation        negative
## 5767                submissive        negative
## 5768               subordinate        negative
## 5769                  subpoena        negative
## 5770                 subpoenas        negative
## 5771              subservience        negative
## 5772               subservient        negative
## 5773               substandard        negative
## 5774                  subtract        negative
## 5775                subversion        negative
## 5776                subversive        negative
## 5777              subversively        negative
## 5778                   subvert        negative
## 5779                   succumb        negative
## 5780                      suck        negative
## 5781                    sucked        negative
## 5782                    sucker        negative
## 5783                     sucks        negative
## 5784                     sucky        negative
## 5785                       sue        negative
## 5786                      sued        negative
## 5787                    sueing        negative
## 5788                      sues        negative
## 5789                    suffer        negative
## 5790                  suffered        negative
## 5791                  sufferer        negative
## 5792                 sufferers        negative
## 5793                 suffering        negative
## 5794                   suffers        negative
## 5795                 suffocate        negative
## 5796                sugar coat        negative
## 5797              sugar coated        negative
## 5798               sugarcoated        negative
## 5799                  suicidal        negative
## 5800                   suicide        negative
## 5801                      sulk        negative
## 5802                    sullen        negative
## 5803                     sully        negative
## 5804                    sunder        negative
## 5805                      sunk        negative
## 5806                    sunken        negative
## 5807               superficial        negative
## 5808            superficiality        negative
## 5809             superficially        negative
## 5810               superfluous        negative
## 5811              superstition        negative
## 5812             superstitious        negative
## 5813                  suppress        negative
## 5814               suppression        negative
## 5815                 surrender        negative
## 5816               susceptible        negative
## 5817                   suspect        negative
## 5818                 suspicion        negative
## 5819                suspicions        negative
## 5820                suspicious        negative
## 5821              suspiciously        negative
## 5822                   swagger        negative
## 5823                   swamped        negative
## 5824                    sweaty        negative
## 5825                   swelled        negative
## 5826                  swelling        negative
## 5827                   swindle        negative
## 5828                     swipe        negative
## 5829                   swollen        negative
## 5830                   symptom        negative
## 5831                  symptoms        negative
## 5832                  syndrome        negative
## 5833                     taboo        negative
## 5834                     tacky        negative
## 5835                     taint        negative
## 5836                   tainted        negative
## 5837                    tamper        negative
## 5838                    tangle        negative
## 5839                   tangled        negative
## 5840                   tangles        negative
## 5841                      tank        negative
## 5842                    tanked        negative
## 5843                     tanks        negative
## 5844                   tantrum        negative
## 5845                     tardy        negative
## 5846                   tarnish        negative
## 5847                 tarnished        negative
## 5848                 tarnishes        negative
## 5849                tarnishing        negative
## 5850                  tattered        negative
## 5851                     taunt        negative
## 5852                  taunting        negative
## 5853                tauntingly        negative
## 5854                    taunts        negative
## 5855                      taut        negative
## 5856                    tawdry        negative
## 5857                    taxing        negative
## 5858                     tease        negative
## 5859                 teasingly        negative
## 5860                   tedious        negative
## 5861                 tediously        negative
## 5862                  temerity        negative
## 5863                    temper        negative
## 5864                   tempest        negative
## 5865                temptation        negative
## 5866                tenderness        negative
## 5867                     tense        negative
## 5868                   tension        negative
## 5869                 tentative        negative
## 5870               tentatively        negative
## 5871                   tenuous        negative
## 5872                 tenuously        negative
## 5873                     tepid        negative
## 5874                  terrible        negative
## 5875              terribleness        negative
## 5876                  terribly        negative
## 5877                    terror        negative
## 5878              terror genic        negative
## 5879                 terrorism        negative
## 5880                 terrorize        negative
## 5881                   testily        negative
## 5882                     testy        negative
## 5883                  tetchily        negative
## 5884                    tetchy        negative
## 5885                 thankless        negative
## 5886                   thicker        negative
## 5887                    thirst        negative
## 5888                    thorny        negative
## 5889               thoughtless        negative
## 5890             thoughtlessly        negative
## 5891           thoughtlessness        negative
## 5892                    thrash        negative
## 5893                    threat        negative
## 5894                  threaten        negative
## 5895               threatening        negative
## 5896                   threats        negative
## 5897                 threesome        negative
## 5898                     throb        negative
## 5899                  throbbed        negative
## 5900                 throbbing        negative
## 5901                    throbs        negative
## 5902                  throttle        negative
## 5903                      thug        negative
## 5904                thumb down        negative
## 5905               thumbs down        negative
## 5906                    thwart        negative
## 5907            time consuming        negative
## 5908                     timid        negative
## 5909                  timidity        negative
## 5910                   timidly        negative
## 5911                 timidness        negative
## 5912                     tin y        negative
## 5913                   tingled        negative
## 5914                  tingling        negative
## 5915                     tired        negative
## 5916                  tiresome        negative
## 5917                    tiring        negative
## 5918                  tiringly        negative
## 5919                      toil        negative
## 5920                      toll        negative
## 5921                 top heavy        negative
## 5922                    topple        negative
## 5923                   torment        negative
## 5924                 tormented        negative
## 5925                   torrent        negative
## 5926                  tortuous        negative
## 5927                   torture        negative
## 5928                  tortured        negative
## 5929                  tortures        negative
## 5930                 torturing        negative
## 5931                 torturous        negative
## 5932               torturously        negative
## 5933              totalitarian        negative
## 5934                    touchy        negative
## 5935                 toughness        negative
## 5936                      tout        negative
## 5937                    touted        negative
## 5938                     touts        negative
## 5939                     toxic        negative
## 5940                   traduce        negative
## 5941                   tragedy        negative
## 5942                    tragic        negative
## 5943                tragically        negative
## 5944                   traitor        negative
## 5945                traitorous        negative
## 5946              traitorously        negative
## 5947                     tramp        negative
## 5948                   trample        negative
## 5949                transgress        negative
## 5950             transgression        negative
## 5951                      trap        negative
## 5952                    traped        negative
## 5953                   trapped        negative
## 5954                     trash        negative
## 5955                   trashed        negative
## 5956                    trashy        negative
## 5957                    trauma        negative
## 5958                 traumatic        negative
## 5959             traumatically        negative
## 5960                traumatize        negative
## 5961               traumatized        negative
## 5962                travesties        negative
## 5963                  travesty        negative
## 5964               treacherous        negative
## 5965             treacherously        negative
## 5966                 treachery        negative
## 5967                   treason        negative
## 5968                treasonous        negative
## 5969                     trick        negative
## 5970                   tricked        negative
## 5971                  trickery        negative
## 5972                    tricky        negative
## 5973                   trivial        negative
## 5974                trivialize        negative
## 5975                   trouble        negative
## 5976                  troubled        negative
## 5977              troublemaker        negative
## 5978                  troubles        negative
## 5979               troublesome        negative
## 5980             troublesomely        negative
## 5981                 troubling        negative
## 5982               troublingly        negative
## 5983                    truant        negative
## 5984                    tumble        negative
## 5985                   tumbled        negative
## 5986                   tumbles        negative
## 5987                tumultuous        negative
## 5988                 turbulent        negative
## 5989                   turmoil        negative
## 5990                     twist        negative
## 5991                   twisted        negative
## 5992                    twists        negative
## 5993                 two faced        negative
## 5994                 two faces        negative
## 5995                tyrannical        negative
## 5996              tyrannically        negative
## 5997                   tyranny        negative
## 5998                    tyrant        negative
## 5999                       ugh        negative
## 6000                    uglier        negative
## 6001                   ugliest        negative
## 6002                  ugliness        negative
## 6003                      ugly        negative
## 6004                  ulterior        negative
## 6005                 ultimatum        negative
## 6006                ultimatums        negative
## 6007            ultra hardline        negative
## 6008               un viewable        negative
## 6009                    unable        negative
## 6010              unacceptable        negative
## 6011            unacceptablely        negative
## 6012              unacceptably        negative
## 6013              unaccessible        negative
## 6014              unaccustomed        negative
## 6015              unachievable        negative
## 6016              unaffordable        negative
## 6017               unappealing        negative
## 6018              unattractive        negative
## 6019               unauthentic        negative
## 6020               unavailable        negative
## 6021               unavoidably        negative
## 6022                unbearable        negative
## 6023              unbearablely        negative
## 6024              unbelievable        negative
## 6025              unbelievably        negative
## 6026                  uncaring        negative
## 6027                 uncertain        negative
## 6028                   uncivil        negative
## 6029               uncivilized        negative
## 6030                   unclean        negative
## 6031                   unclear        negative
## 6032             uncollectible        negative
## 6033             uncomfortable        negative
## 6034             uncomfortably        negative
## 6035                   uncomfy        negative
## 6036             uncompetitive        negative
## 6037            uncompromising        negative
## 6038          uncompromisingly        negative
## 6039               unconfirmed        negative
## 6040          unconstitutional        negative
## 6041              uncontrolled        negative
## 6042              unconvincing        negative
## 6043            unconvincingly        negative
## 6044             uncooperative        negative
## 6045                   uncouth        negative
## 6046                uncreative        negative
## 6047                 undecided        negative
## 6048                 undefined        negative
## 6049           undependability        negative
## 6050              undependable        negative
## 6051                  undercut        negative
## 6052                 undercuts        negative
## 6053              undercutting        negative
## 6054                  underdog        negative
## 6055             underestimate        negative
## 6056                underlings        negative
## 6057                 undermine        negative
## 6058                undermined        negative
## 6059                undermines        negative
## 6060               undermining        negative
## 6061                 underpaid        negative
## 6062              underpowered        negative
## 6063                undersized        negative
## 6064               undesirable        negative
## 6065              undetermined        negative
## 6066                     undid        negative
## 6067               undignified        negative
## 6068               undissolved        negative
## 6069              undocumented        negative
## 6070                    undone        negative
## 6071                     undue        negative
## 6072                    unease        negative
## 6073                  uneasily        negative
## 6074                uneasiness        negative
## 6075                    uneasy        negative
## 6076              uneconomical        negative
## 6077                unemployed        negative
## 6078                   unequal        negative
## 6079                 unethical        negative
## 6080                    uneven        negative
## 6081                uneventful        negative
## 6082                unexpected        negative
## 6083              unexpectedly        negative
## 6084               unexplained        negative
## 6085                  unfairly        negative
## 6086                unfaithful        negative
## 6087              unfaithfully        negative
## 6088                unfamiliar        negative
## 6089               unfavorable        negative
## 6090                 unfeeling        negative
## 6091                unfinished        negative
## 6092                     unfit        negative
## 6093                unforeseen        negative
## 6094               unforgiving        negative
## 6095               unfortunate        negative
## 6096             unfortunately        negative
## 6097                 unfounded        negative
## 6098                unfriendly        negative
## 6099               unfulfilled        negative
## 6100                  unfunded        negative
## 6101              ungovernable        negative
## 6102                ungrateful        negative
## 6103                 unhappily        negative
## 6104               unhappiness        negative
## 6105                   unhappy        negative
## 6106                 unhealthy        negative
## 6107                 unhelpful        negative
## 6108             unilateralism        negative
## 6109              unimaginable        negative
## 6110              unimaginably        negative
## 6111               unimportant        negative
## 6112                uninformed        negative
## 6113                 uninsured        negative
## 6114            unintelligible        negative
## 6115             unintelligile        negative
## 6116                  unipolar        negative
## 6117                    unjust        negative
## 6118             unjustifiable        negative
## 6119             unjustifiably        negative
## 6120               unjustified        negative
## 6121                  unjustly        negative
## 6122                    unkind        negative
## 6123                  unkindly        negative
## 6124                   unknown        negative
## 6125              unlamentable        negative
## 6126              unlamentably        negative
## 6127                  unlawful        negative
## 6128                unlawfully        negative
## 6129              unlawfulness        negative
## 6130                   unleash        negative
## 6131                unlicensed        negative
## 6132                  unlikely        negative
## 6133                   unlucky        negative
## 6134                   unmoved        negative
## 6135                 unnatural        negative
## 6136               unnaturally        negative
## 6137               unnecessary        negative
## 6138                  unneeded        negative
## 6139                   unnerve        negative
## 6140                  unnerved        negative
## 6141                 unnerving        negative
## 6142               unnervingly        negative
## 6143                 unnoticed        negative
## 6144                unobserved        negative
## 6145                unorthodox        negative
## 6146               unorthodoxy        negative
## 6147                unpleasant        negative
## 6148            unpleasantries        negative
## 6149                 unpopular        negative
## 6150             unpredictable        negative
## 6151                unprepared        negative
## 6152              unproductive        negative
## 6153              unprofitable        negative
## 6154                   unprove        negative
## 6155                  unproved        negative
## 6156                  unproven        negative
## 6157                  unproves        negative
## 6158                 unproving        negative
## 6159               unqualified        negative
## 6160                   unravel        negative
## 6161                 unraveled        negative
## 6162               unreachable        negative
## 6163                unreadable        negative
## 6164               unrealistic        negative
## 6165              unreasonable        negative
## 6166              unreasonably        negative
## 6167               unrelenting        negative
## 6168             unrelentingly        negative
## 6169             unreliability        negative
## 6170                unreliable        negative
## 6171                unresolved        negative
## 6172              unresponsive        negative
## 6173                    unrest        negative
## 6174                    unruly        negative
## 6175                    unsafe        negative
## 6176            unsatisfactory        negative
## 6177                  unsavory        negative
## 6178              unscrupulous        negative
## 6179            unscrupulously        negative
## 6180                  unsecure        negative
## 6181                  unseemly        negative
## 6182                  unsettle        negative
## 6183                 unsettled        negative
## 6184                unsettling        negative
## 6185              unsettlingly        negative
## 6186                 unskilled        negative
## 6187           unsophisticated        negative
## 6188                   unsound        negative
## 6189               unspeakable        negative
## 6190             unspeakablely        negative
## 6191               unspecified        negative
## 6192                  unstable        negative
## 6193                unsteadily        negative
## 6194              unsteadiness        negative
## 6195                  unsteady        negative
## 6196              unsuccessful        negative
## 6197            unsuccessfully        negative
## 6198               unsupported        negative
## 6199              unsupportive        negative
## 6200                    unsure        negative
## 6201              unsuspecting        negative
## 6202             unsustainable        negative
## 6203                 untenable        negative
## 6204                  untested        negative
## 6205               unthinkable        negative
## 6206               unthinkably        negative
## 6207                  untimely        negative
## 6208                 untouched        negative
## 6209                    untrue        negative
## 6210             untrustworthy        negative
## 6211                untruthful        negative
## 6212                  unusable        negative
## 6213                  unusably        negative
## 6214                 unuseable        negative
## 6215                 unuseably        negative
## 6216                   unusual        negative
## 6217                 unusually        negative
## 6218                unviewable        negative
## 6219                  unwanted        negative
## 6220               unwarranted        negative
## 6221               unwatchable        negative
## 6222                 unwelcome        negative
## 6223                    unwell        negative
## 6224                  unwieldy        negative
## 6225                 unwilling        negative
## 6226               unwillingly        negative
## 6227             unwillingness        negative
## 6228                    unwise        negative
## 6229                  unwisely        negative
## 6230                unworkable        negative
## 6231                  unworthy        negative
## 6232                unyielding        negative
## 6233                   upbraid        negative
## 6234                  upheaval        negative
## 6235                  uprising        negative
## 6236                    uproar        negative
## 6237                uproarious        negative
## 6238              uproariously        negative
## 6239                 uproarous        negative
## 6240               uproarously        negative
## 6241                    uproot        negative
## 6242                     upset        negative
## 6243                  upseting        negative
## 6244                    upsets        negative
## 6245                 upsetting        negative
## 6246               upsettingly        negative
## 6247                    urgent        negative
## 6248                   useless        negative
## 6249                     usurp        negative
## 6250                   usurper        negative
## 6251                   utterly        negative
## 6252                   vagrant        negative
## 6253                     vague        negative
## 6254                 vagueness        negative
## 6255                      vain        negative
## 6256                    vainly        negative
## 6257                    vanity        negative
## 6258                  vehement        negative
## 6259                vehemently        negative
## 6260                 vengeance        negative
## 6261                  vengeful        negative
## 6262                vengefully        negative
## 6263              vengefulness        negative
## 6264                     venom        negative
## 6265                  venomous        negative
## 6266                venomously        negative
## 6267                      vent        negative
## 6268                  vestiges        negative
## 6269                       vex        negative
## 6270                  vexation        negative
## 6271                    vexing        negative
## 6272                  vexingly        negative
## 6273                   vibrate        negative
## 6274                  vibrated        negative
## 6275                  vibrates        negative
## 6276                 vibrating        negative
## 6277                 vibration        negative
## 6278                      vice        negative
## 6279                   vicious        negative
## 6280                 viciously        negative
## 6281               viciousness        negative
## 6282                 victimize        negative
## 6283                      vile        negative
## 6284                  vileness        negative
## 6285                    vilify        negative
## 6286                villainous        negative
## 6287              villainously        negative
## 6288                  villains        negative
## 6289                   villian        negative
## 6290                villianous        negative
## 6291              villianously        negative
## 6292                   villify        negative
## 6293                vindictive        negative
## 6294              vindictively        negative
## 6295            vindictiveness        negative
## 6296                   violate        negative
## 6297                 violation        negative
## 6298                  violator        negative
## 6299                 violators        negative
## 6300                   violent        negative
## 6301                 violently        negative
## 6302                     viper        negative
## 6303                 virulence        negative
## 6304                  virulent        negative
## 6305                virulently        negative
## 6306                     virus        negative
## 6307                vociferous        negative
## 6308              vociferously        negative
## 6309                  volatile        negative
## 6310                volatility        negative
## 6311                     vomit        negative
## 6312                   vomited        negative
## 6313                  vomiting        negative
## 6314                    vomits        negative
## 6315                    vulgar        negative
## 6316                vulnerable        negative
## 6317                      wack        negative
## 6318                      wail        negative
## 6319                    wallow        negative
## 6320                      wane        negative
## 6321                    waning        negative
## 6322                    wanton        negative
## 6323                  war like        negative
## 6324                    warily        negative
## 6325                  wariness        negative
## 6326                   warlike        negative
## 6327                    warned        negative
## 6328                   warning        negative
## 6329                      warp        negative
## 6330                    warped        negative
## 6331                      wary        negative
## 6332                washed out        negative
## 6333                     waste        negative
## 6334                    wasted        negative
## 6335                  wasteful        negative
## 6336              wastefulness        negative
## 6337                   wasting        negative
## 6338                water down        negative
## 6339              watered down        negative
## 6340                   wayward        negative
## 6341                      weak        negative
## 6342                    weaken        negative
## 6343                 weakening        negative
## 6344                    weaker        negative
## 6345                  weakness        negative
## 6346                weaknesses        negative
## 6347                 weariness        negative
## 6348                 wearisome        negative
## 6349                     weary        negative
## 6350                     wedge        negative
## 6351                      weed        negative
## 6352                      weep        negative
## 6353                     weird        negative
## 6354                   weirdly        negative
## 6355                   wheedle        negative
## 6356                   whimper        negative
## 6357                     whine        negative
## 6358                   whining        negative
## 6359                     whiny        negative
## 6360                     whips        negative
## 6361                     whore        negative
## 6362                    whores        negative
## 6363                    wicked        negative
## 6364                  wickedly        negative
## 6365                wickedness        negative
## 6366                      wild        negative
## 6367                    wildly        negative
## 6368                     wiles        negative
## 6369                      wilt        negative
## 6370                      wily        negative
## 6371                     wimpy        negative
## 6372                     wince        negative
## 6373                    wobble        negative
## 6374                   wobbled        negative
## 6375                   wobbles        negative
## 6376                       woe        negative
## 6377                 woebegone        negative
## 6378                    woeful        negative
## 6379                  woefully        negative
## 6380                 womanizer        negative
## 6381                womanizing        negative
## 6382                      worn        negative
## 6383                   worried        negative
## 6384                 worriedly        negative
## 6385                   worrier        negative
## 6386                   worries        negative
## 6387                 worrisome        negative
## 6388                     worry        negative
## 6389                  worrying        negative
## 6390                worryingly        negative
## 6391                     worse        negative
## 6392                    worsen        negative
## 6393                 worsening        negative
## 6394                     worst        negative
## 6395                 worthless        negative
## 6396               worthlessly        negative
## 6397             worthlessness        negative
## 6398                     wound        negative
## 6399                    wounds        negative
## 6400                   wrangle        negative
## 6401                     wrath        negative
## 6402                     wreak        negative
## 6403                   wreaked        negative
## 6404                    wreaks        negative
## 6405                     wreck        negative
## 6406                     wrest        negative
## 6407                   wrestle        negative
## 6408                    wretch        negative
## 6409                  wretched        negative
## 6410                wretchedly        negative
## 6411              wretchedness        negative
## 6412                   wrinkle        negative
## 6413                  wrinkled        negative
## 6414                  wrinkles        negative
## 6415                      wrip        negative
## 6416                   wripped        negative
## 6417                  wripping        negative
## 6418                    writhe        negative
## 6419                     wrong        negative
## 6420                  wrongful        negative
## 6421                   wrongly        negative
## 6422                   wrought        negative
## 6423                      yawn        negative
## 6424                       zap        negative
## 6425                    zapped        negative
## 6426                      zaps        negative
## 6427                    zealot        negative
## 6428                   zealous        negative
## 6429                 zealously        negative
## 6430                    zombie        negative
## 6431                    a plus        positive
## 6432                    abound        positive
## 6433                   abounds        positive
## 6434                 abundance        positive
## 6435                  abundant        positive
## 6436                accessable        positive
## 6437                accessible        positive
## 6438                   acclaim        positive
## 6439                 acclaimed        positive
## 6440               acclamation        positive
## 6441                  accolade        positive
## 6442                 accolades        positive
## 6443             accommodative        positive
## 6444              accomodative        positive
## 6445                accomplish        positive
## 6446              accomplished        positive
## 6447            accomplishment        positive
## 6448           accomplishments        positive
## 6449                  accurate        positive
## 6450                accurately        positive
## 6451                achievable        positive
## 6452               achievement        positive
## 6453              achievements        positive
## 6454                achievible        positive
## 6455                    acumen        positive
## 6456                 adaptable        positive
## 6457                  adaptive        positive
## 6458                  adequate        positive
## 6459                adjustable        positive
## 6460                 admirable        positive
## 6461                 admirably        positive
## 6462                admiration        positive
## 6463                    admire        positive
## 6464                   admirer        positive
## 6465                  admiring        positive
## 6466                admiringly        positive
## 6467                  adorable        positive
## 6468                     adore        positive
## 6469                    adored        positive
## 6470                    adorer        positive
## 6471                   adoring        positive
## 6472                 adoringly        positive
## 6473                    adroit        positive
## 6474                  adroitly        positive
## 6475                   adulate        positive
## 6476                 adulation        positive
## 6477                 adulatory        positive
## 6478                  advanced        positive
## 6479                 advantage        positive
## 6480              advantageous        positive
## 6481            advantageously        positive
## 6482                advantages        positive
## 6483             adventuresome        positive
## 6484               adventurous        positive
## 6485                  advocate        positive
## 6486                 advocated        positive
## 6487                 advocates        positive
## 6488                affability        positive
## 6489                   affable        positive
## 6490                   affably        positive
## 6491               affectation        positive
## 6492                 affection        positive
## 6493              affectionate        positive
## 6494                  affinity        positive
## 6495                    affirm        positive
## 6496               affirmation        positive
## 6497               affirmative        positive
## 6498                 affluence        positive
## 6499                  affluent        positive
## 6500                    afford        positive
## 6501                affordable        positive
## 6502                affordably        positive
## 6503                 afordable        positive
## 6504                     agile        positive
## 6505                   agilely        positive
## 6506                   agility        positive
## 6507                 agreeable        positive
## 6508             agreeableness        positive
## 6509                 agreeably        positive
## 6510                all around        positive
## 6511                  alluring        positive
## 6512                alluringly        positive
## 6513                altruistic        positive
## 6514            altruistically        positive
## 6515                     amaze        positive
## 6516                    amazed        positive
## 6517                 amazement        positive
## 6518                    amazes        positive
## 6519                   amazing        positive
## 6520                 amazingly        positive
## 6521                 ambitious        positive
## 6522               ambitiously        positive
## 6523                ameliorate        positive
## 6524                  amenable        positive
## 6525                   amenity        positive
## 6526                amiability        positive
## 6527                  amiabily        positive
## 6528                   amiable        positive
## 6529               amicability        positive
## 6530                  amicable        positive
## 6531                  amicably        positive
## 6532                     amity        positive
## 6533                     ample        positive
## 6534                     amply        positive
## 6535                     amuse        positive
## 6536                   amusing        positive
## 6537                 amusingly        positive
## 6538                     angel        positive
## 6539                   angelic        positive
## 6540                apotheosis        positive
## 6541                    appeal        positive
## 6542                 appealing        positive
## 6543                   applaud        positive
## 6544               appreciable        positive
## 6545                appreciate        positive
## 6546               appreciated        positive
## 6547               appreciates        positive
## 6548              appreciative        positive
## 6549            appreciatively        positive
## 6550               appropriate        positive
## 6551                  approval        positive
## 6552                   approve        positive
## 6553                    ardent        positive
## 6554                  ardently        positive
## 6555                     ardor        positive
## 6556                articulate        positive
## 6557                aspiration        positive
## 6558               aspirations        positive
## 6559                    aspire        positive
## 6560                 assurance        positive
## 6561                assurances        positive
## 6562                    assure        positive
## 6563                 assuredly        positive
## 6564                  assuring        positive
## 6565                  astonish        positive
## 6566                astonished        positive
## 6567               astonishing        positive
## 6568             astonishingly        positive
## 6569              astonishment        positive
## 6570                   astound        positive
## 6571                 astounded        positive
## 6572                astounding        positive
## 6573              astoundingly        positive
## 6574                  astutely        positive
## 6575                 attentive        positive
## 6576                attraction        positive
## 6577                attractive        positive
## 6578              attractively        positive
## 6579                    attune        positive
## 6580                   audible        positive
## 6581                   audibly        positive
## 6582                auspicious        positive
## 6583                 authentic        positive
## 6584             authoritative        positive
## 6585                autonomous        positive
## 6586                 available        positive
## 6587                      aver        positive
## 6588                      avid        positive
## 6589                    avidly        positive
## 6590                     award        positive
## 6591                   awarded        positive
## 6592                    awards        positive
## 6593                       awe        positive
## 6594                      awed        positive
## 6595                   awesome        positive
## 6596                 awesomely        positive
## 6597               awesomeness        positive
## 6598                 awestruck        positive
## 6599                    awsome        positive
## 6600                  backbone        positive
## 6601                  balanced        positive
## 6602                   bargain        positive
## 6603                 beauteous        positive
## 6604                 beautiful        positive
## 6605              beautifullly        positive
## 6606               beautifully        positive
## 6607                  beautify        positive
## 6608                    beauty        positive
## 6609                    beckon        positive
## 6610                  beckoned        positive
## 6611                 beckoning        positive
## 6612                   beckons        positive
## 6613                believable        positive
## 6614               believeable        positive
## 6615                   beloved        positive
## 6616                benefactor        positive
## 6617                beneficent        positive
## 6618                beneficial        positive
## 6619              beneficially        positive
## 6620               beneficiary        positive
## 6621                   benefit        positive
## 6622                  benefits        positive
## 6623               benevolence        positive
## 6624                benevolent        positive
## 6625                  benifits        positive
## 6626                      best        positive
## 6627                best known        positive
## 6628           best performing        positive
## 6629              best selling        positive
## 6630                    better        positive
## 6631              better known        positive
## 6632      better than expected        positive
## 6633                beutifully        positive
## 6634                 blameless        positive
## 6635                     bless        positive
## 6636                  blessing        positive
## 6637                     bliss        positive
## 6638                  blissful        positive
## 6639                blissfully        positive
## 6640                    blithe        positive
## 6641               blockbuster        positive
## 6642                     bloom        positive
## 6643                   blossom        positive
## 6644                   bolster        positive
## 6645                     bonny        positive
## 6646                     bonus        positive
## 6647                   bonuses        positive
## 6648                      boom        positive
## 6649                   booming        positive
## 6650                     boost        positive
## 6651                 boundless        positive
## 6652                 bountiful        positive
## 6653                 brainiest        positive
## 6654                    brainy        positive
## 6655                 brand new        positive
## 6656                     brave        positive
## 6657                   bravery        positive
## 6658                     bravo        positive
## 6659              breakthrough        positive
## 6660             breakthroughs        positive
## 6661            breathlessness        positive
## 6662              breathtaking        positive
## 6663            breathtakingly        positive
## 6664                    breeze        positive
## 6665                    bright        positive
## 6666                  brighten        positive
## 6667                  brighter        positive
## 6668                 brightest        positive
## 6669                brilliance        positive
## 6670               brilliances        positive
## 6671                 brilliant        positive
## 6672               brilliantly        positive
## 6673                     brisk        positive
## 6674                 brotherly        positive
## 6675                   bullish        positive
## 6676                   buoyant        positive
## 6677                    cajole        positive
## 6678                      calm        positive
## 6679                   calming        positive
## 6680                  calmness        positive
## 6681                capability        positive
## 6682                   capable        positive
## 6683                   capably        positive
## 6684                 captivate        positive
## 6685               captivating        positive
## 6686                  carefree        positive
## 6687                  cashback        positive
## 6688                 cashbacks        positive
## 6689                    catchy        positive
## 6690                 celebrate        positive
## 6691                celebrated        positive
## 6692               celebration        positive
## 6693               celebratory        positive
## 6694                     champ        positive
## 6695                  champion        positive
## 6696                  charisma        positive
## 6697               charismatic        positive
## 6698                charitable        positive
## 6699                     charm        positive
## 6700                  charming        positive
## 6701                charmingly        positive
## 6702                    chaste        positive
## 6703                   cheaper        positive
## 6704                  cheapest        positive
## 6705                     cheer        positive
## 6706                  cheerful        positive
## 6707                    cheery        positive
## 6708                   cherish        positive
## 6709                 cherished        positive
## 6710                    cherub        positive
## 6711                      chic        positive
## 6712                chivalrous        positive
## 6713                  chivalry        positive
## 6714                  civility        positive
## 6715                  civilize        positive
## 6716                   clarity        positive
## 6717                   classic        positive
## 6718                    classy        positive
## 6719                     clean        positive
## 6720                   cleaner        positive
## 6721                  cleanest        positive
## 6722               cleanliness        positive
## 6723                   cleanly        positive
## 6724                     clear        positive
## 6725                 clear cut        positive
## 6726                   cleared        positive
## 6727                   clearer        positive
## 6728                   clearly        positive
## 6729                    clears        positive
## 6730                    clever        positive
## 6731                  cleverly        positive
## 6732                    cohere        positive
## 6733                 coherence        positive
## 6734                  coherent        positive
## 6735                  cohesive        positive
## 6736                  colorful        positive
## 6737                    comely        positive
## 6738                   comfort        positive
## 6739               comfortable        positive
## 6740               comfortably        positive
## 6741                comforting        positive
## 6742                     comfy        positive
## 6743                   commend        positive
## 6744               commendable        positive
## 6745               commendably        positive
## 6746                commitment        positive
## 6747                commodious        positive
## 6748                   compact        positive
## 6749                 compactly        positive
## 6750                compassion        positive
## 6751             compassionate        positive
## 6752                compatible        positive
## 6753               competitive        positive
## 6754                complement        positive
## 6755             complementary        positive
## 6756              complemented        positive
## 6757               complements        positive
## 6758                 compliant        positive
## 6759                compliment        positive
## 6760             complimentary        positive
## 6761             comprehensive        positive
## 6762                conciliate        positive
## 6763              conciliatory        positive
## 6764                   concise        positive
## 6765                confidence        positive
## 6766                 confident        positive
## 6767                 congenial        positive
## 6768              congratulate        positive
## 6769            congratulation        positive
## 6770           congratulations        positive
## 6771            congratulatory        positive
## 6772             conscientious        positive
## 6773               considerate        positive
## 6774                consistent        positive
## 6775              consistently        positive
## 6776              constructive        positive
## 6777                consummate        positive
## 6778               contentment        positive
## 6779                continuity        positive
## 6780                 contrasty        positive
## 6781              contribution        positive
## 6782               convenience        positive
## 6783                convenient        positive
## 6784              conveniently        positive
## 6785                 convience        positive
## 6786               convienient        positive
## 6787                  convient        positive
## 6788                convincing        positive
## 6789              convincingly        positive
## 6790                      cool        positive
## 6791                   coolest        positive
## 6792               cooperative        positive
## 6793             cooperatively        positive
## 6794               cornerstone        positive
## 6795                   correct        positive
## 6796                 correctly        positive
## 6797            cost effective        positive
## 6798               cost saving        positive
## 6799            counter attack        positive
## 6800           counter attacks        positive
## 6801                   courage        positive
## 6802                courageous        positive
## 6803              courageously        positive
## 6804            courageousness        positive
## 6805                 courteous        positive
## 6806                   courtly        positive
## 6807                  covenant        positive
## 6808                      cozy        positive
## 6809                  creative        positive
## 6810                  credence        positive
## 6811                  credible        positive
## 6812                     crisp        positive
## 6813                   crisper        positive
## 6814                      cure        positive
## 6815                  cure all        positive
## 6816                     cushy        positive
## 6817                      cute        positive
## 6818                  cuteness        positive
## 6819                     danke        positive
## 6820                    danken        positive
## 6821                    daring        positive
## 6822                  daringly        positive
## 6823                   darling        positive
## 6824                   dashing        positive
## 6825                 dauntless        positive
## 6826                      dawn        positive
## 6827                    dazzle        positive
## 6828                   dazzled        positive
## 6829                  dazzling        positive
## 6830                dead cheap        positive
## 6831                   dead on        positive
## 6832                   decency        positive
## 6833                    decent        positive
## 6834                  decisive        positive
## 6835              decisiveness        positive
## 6836                 dedicated        positive
## 6837                    defeat        positive
## 6838                  defeated        positive
## 6839                 defeating        positive
## 6840                   defeats        positive
## 6841                  defender        positive
## 6842                 deference        positive
## 6843                      deft        positive
## 6844                deginified        positive
## 6845                delectable        positive
## 6846                  delicacy        positive
## 6847                  delicate        positive
## 6848                 delicious        positive
## 6849                   delight        positive
## 6850                 delighted        positive
## 6851                delightful        positive
## 6852              delightfully        positive
## 6853            delightfulness        positive
## 6854                dependable        positive
## 6855                dependably        positive
## 6856                deservedly        positive
## 6857                 deserving        positive
## 6858                 desirable        positive
## 6859                  desiring        positive
## 6860                  desirous        positive
## 6861                   destiny        positive
## 6862                detachable        positive
## 6863                    devout        positive
## 6864                 dexterous        positive
## 6865               dexterously        positive
## 6866                  dextrous        positive
## 6867                 dignified        positive
## 6868                   dignify        positive
## 6869                   dignity        positive
## 6870                 diligence        positive
## 6871                  diligent        positive
## 6872                diligently        positive
## 6873                diplomatic        positive
## 6874                dirt cheap        positive
## 6875               distinction        positive
## 6876               distinctive        positive
## 6877             distinguished        positive
## 6878               diversified        positive
## 6879                    divine        positive
## 6880                  divinely        positive
## 6881                  dominate        positive
## 6882                 dominated        positive
## 6883                 dominates        positive
## 6884                      dote        positive
## 6885                  dotingly        positive
## 6886                 doubtless        positive
## 6887                 dreamland        positive
## 6888               dumbfounded        positive
## 6889              dumbfounding        positive
## 6890               dummy proof        positive
## 6891                   durable        positive
## 6892                   dynamic        positive
## 6893                     eager        positive
## 6894                   eagerly        positive
## 6895                 eagerness        positive
## 6896                   earnest        positive
## 6897                 earnestly        positive
## 6898               earnestness        positive
## 6899                      ease        positive
## 6900                     eased        positive
## 6901                     eases        positive
## 6902                    easier        positive
## 6903                   easiest        positive
## 6904                  easiness        positive
## 6905                    easing        positive
## 6906                      easy        positive
## 6907               easy to use        positive
## 6908                 easygoing        positive
## 6909                ebullience        positive
## 6910                 ebullient        positive
## 6911               ebulliently        positive
## 6912                ecenomical        positive
## 6913                economical        positive
## 6914                 ecstasies        positive
## 6915                   ecstasy        positive
## 6916                  ecstatic        positive
## 6917              ecstatically        positive
## 6918                     edify        positive
## 6919                  educated        positive
## 6920                 effective        positive
## 6921               effectively        positive
## 6922             effectiveness        positive
## 6923                 effectual        positive
## 6924               efficacious        positive
## 6925                 efficient        positive
## 6926               efficiently        positive
## 6927                effortless        positive
## 6928              effortlessly        positive
## 6929                  effusion        positive
## 6930                  effusive        positive
## 6931                effusively        positive
## 6932              effusiveness        positive
## 6933                      elan        positive
## 6934                     elate        positive
## 6935                    elated        positive
## 6936                  elatedly        positive
## 6937                   elation        positive
## 6938                 electrify        positive
## 6939                  elegance        positive
## 6940                   elegant        positive
## 6941                 elegantly        positive
## 6942                   elevate        positive
## 6943                     elite        positive
## 6944                 eloquence        positive
## 6945                  eloquent        positive
## 6946                eloquently        positive
## 6947                  embolden        positive
## 6948                  eminence        positive
## 6949                   eminent        positive
## 6950                 empathize        positive
## 6951                   empathy        positive
## 6952                   empower        positive
## 6953               empowerment        positive
## 6954                   enchant        positive
## 6955                 enchanted        positive
## 6956                enchanting        positive
## 6957              enchantingly        positive
## 6958                 encourage        positive
## 6959             encouragement        positive
## 6960               encouraging        positive
## 6961             encouragingly        positive
## 6962                    endear        positive
## 6963                 endearing        positive
## 6964                   endorse        positive
## 6965                  endorsed        positive
## 6966               endorsement        positive
## 6967                  endorses        positive
## 6968                 endorsing        positive
## 6969                 energetic        positive
## 6970                  energize        positive
## 6971          energy efficient        positive
## 6972             energy saving        positive
## 6973                  engaging        positive
## 6974                engrossing        positive
## 6975                   enhance        positive
## 6976                  enhanced        positive
## 6977               enhancement        positive
## 6978                  enhances        positive
## 6979                     enjoy        positive
## 6980                 enjoyable        positive
## 6981                 enjoyably        positive
## 6982                   enjoyed        positive
## 6983                  enjoying        positive
## 6984                 enjoyment        positive
## 6985                    enjoys        positive
## 6986                 enlighten        positive
## 6987             enlightenment        positive
## 6988                   enliven        positive
## 6989                   ennoble        positive
## 6990                    enough        positive
## 6991                    enrapt        positive
## 6992                 enrapture        positive
## 6993                enraptured        positive
## 6994                    enrich        positive
## 6995                enrichment        positive
## 6996              enterprising        positive
## 6997                 entertain        positive
## 6998              entertaining        positive
## 6999                entertains        positive
## 7000                   enthral        positive
## 7001                  enthrall        positive
## 7002                enthralled        positive
## 7003                   enthuse        positive
## 7004                enthusiasm        positive
## 7005                enthusiast        positive
## 7006              enthusiastic        positive
## 7007          enthusiastically        positive
## 7008                    entice        positive
## 7009                   enticed        positive
## 7010                  enticing        positive
## 7011                enticingly        positive
## 7012                 entranced        positive
## 7013                entrancing        positive
## 7014                   entrust        positive
## 7015                  enviable        positive
## 7016                  enviably        positive
## 7017                      envy        positive
## 7018                 equitable        positive
## 7019               ergonomical        positive
## 7020                  err free        positive
## 7021                   erudite        positive
## 7022                   ethical        positive
## 7023                  eulogize        positive
## 7024                  euphoria        positive
## 7025                  euphoric        positive
## 7026              euphorically        positive
## 7027                evaluative        positive
## 7028                    evenly        positive
## 7029                  eventful        positive
## 7030               everlasting        positive
## 7031                 evocative        positive
## 7032                     exalt        positive
## 7033                exaltation        positive
## 7034                   exalted        positive
## 7035                 exaltedly        positive
## 7036                  exalting        positive
## 7037                exaltingly        positive
## 7038                  examplar        positive
## 7039                 examplary        positive
## 7040                 excallent        positive
## 7041                    exceed        positive
## 7042                  exceeded        positive
## 7043                 exceeding        positive
## 7044               exceedingly        positive
## 7045                   exceeds        positive
## 7046                     excel        positive
## 7047                   exceled        positive
## 7048                  excelent        positive
## 7049                 excellant        positive
## 7050                  excelled        positive
## 7051                excellence        positive
## 7052                excellency        positive
## 7053                 excellent        positive
## 7054               excellently        positive
## 7055                    excels        positive
## 7056               exceptional        positive
## 7057             exceptionally        positive
## 7058                    excite        positive
## 7059                   excited        positive
## 7060                 excitedly        positive
## 7061               excitedness        positive
## 7062                excitement        positive
## 7063                   excites        positive
## 7064                  exciting        positive
## 7065                excitingly        positive
## 7066                  exellent        positive
## 7067                  exemplar        positive
## 7068                 exemplary        positive
## 7069                exhilarate        positive
## 7070              exhilarating        positive
## 7071            exhilaratingly        positive
## 7072              exhilaration        positive
## 7073                 exonerate        positive
## 7074                 expansive        positive
## 7075             expeditiously        positive
## 7076                  expertly        positive
## 7077                 exquisite        positive
## 7078               exquisitely        positive
## 7079                     extol        positive
## 7080                    extoll        positive
## 7081           extraordinarily        positive
## 7082             extraordinary        positive
## 7083                exuberance        positive
## 7084                 exuberant        positive
## 7085               exuberantly        positive
## 7086                     exult        positive
## 7087                  exultant        positive
## 7088                exultation        positive
## 7089                exultingly        positive
## 7090                 eye catch        positive
## 7091              eye catching        positive
## 7092                  eyecatch        positive
## 7093               eyecatching        positive
## 7094                  fabulous        positive
## 7095                fabulously        positive
## 7096                facilitate        positive
## 7097                      fair        positive
## 7098                    fairly        positive
## 7099                  fairness        positive
## 7100                     faith        positive
## 7101                  faithful        positive
## 7102                faithfully        positive
## 7103              faithfulness        positive
## 7104                      fame        positive
## 7105                     famed        positive
## 7106                    famous        positive
## 7107                  famously        positive
## 7108                   fancier        positive
## 7109               fancinating        positive
## 7110                     fancy        positive
## 7111                   fanfare        positive
## 7112                      fans        positive
## 7113                 fantastic        positive
## 7114             fantastically        positive
## 7115                 fascinate        positive
## 7116               fascinating        positive
## 7117             fascinatingly        positive
## 7118               fascination        positive
## 7119               fashionable        positive
## 7120               fashionably        positive
## 7121                      fast        positive
## 7122              fast growing        positive
## 7123                fast paced        positive
## 7124                    faster        positive
## 7125                   fastest        positive
## 7126           fastest growing        positive
## 7127                 faultless        positive
## 7128                       fav        positive
## 7129                      fave        positive
## 7130                     favor        positive
## 7131                 favorable        positive
## 7132                   favored        positive
## 7133                  favorite        positive
## 7134                 favorited        positive
## 7135                    favour        positive
## 7136                  fearless        positive
## 7137                fearlessly        positive
## 7138                  feasible        positive
## 7139                  feasibly        positive
## 7140                      feat        positive
## 7141              feature rich        positive
## 7142                fecilitous        positive
## 7143                    feisty        positive
## 7144                felicitate        positive
## 7145                felicitous        positive
## 7146                  felicity        positive
## 7147                   fertile        positive
## 7148                   fervent        positive
## 7149                 fervently        positive
## 7150                    fervid        positive
## 7151                  fervidly        positive
## 7152                    fervor        positive
## 7153                   festive        positive
## 7154                  fidelity        positive
## 7155                     fiery        positive
## 7156                      fine        positive
## 7157              fine looking        positive
## 7158                    finely        positive
## 7159                     finer        positive
## 7160                    finest        positive
## 7161                    firmer        positive
## 7162               first class        positive
## 7163            first in class        positive
## 7164                first rate        positive
## 7165                    flashy        positive
## 7166                   flatter        positive
## 7167                flattering        positive
## 7168              flatteringly        positive
## 7169                  flawless        positive
## 7170                flawlessly        positive
## 7171               flexibility        positive
## 7172                  flexible        positive
## 7173                  flourish        positive
## 7174               flourishing        positive
## 7175                    fluent        positive
## 7176                   flutter        positive
## 7177                      fond        positive
## 7178                    fondly        positive
## 7179                  fondness        positive
## 7180                 foolproof        positive
## 7181                  foremost        positive
## 7182                 foresight        positive
## 7183                formidable        positive
## 7184                 fortitude        positive
## 7185                fortuitous        positive
## 7186              fortuitously        positive
## 7187                 fortunate        positive
## 7188               fortunately        positive
## 7189                   fortune        positive
## 7190                  fragrant        positive
## 7191                      free        positive
## 7192                     freed        positive
## 7193                   freedom        positive
## 7194                  freedoms        positive
## 7195                     fresh        positive
## 7196                   fresher        positive
## 7197                  freshest        positive
## 7198              friendliness        positive
## 7199                  friendly        positive
## 7200                    frolic        positive
## 7201                    frugal        positive
## 7202                  fruitful        positive
## 7203                       ftw        positive
## 7204               fulfillment        positive
## 7205                       fun        positive
## 7206                futurestic        positive
## 7207                futuristic        positive
## 7208                    gaiety        positive
## 7209                     gaily        positive
## 7210                      gain        positive
## 7211                    gained        positive
## 7212                   gainful        positive
## 7213                 gainfully        positive
## 7214                   gaining        positive
## 7215                     gains        positive
## 7216                   gallant        positive
## 7217                 gallantly        positive
## 7218                    galore        positive
## 7219                   geekier        positive
## 7220                     geeky        positive
## 7221                       gem        positive
## 7222                      gems        positive
## 7223                generosity        positive
## 7224                  generous        positive
## 7225                generously        positive
## 7226                    genial        positive
## 7227                    genius        positive
## 7228                    gentle        positive
## 7229                  gentlest        positive
## 7230                   genuine        positive
## 7231                    gifted        positive
## 7232                      glad        positive
## 7233                   gladden        positive
## 7234                    gladly        positive
## 7235                  gladness        positive
## 7236                 glamorous        positive
## 7237                      glee        positive
## 7238                   gleeful        positive
## 7239                 gleefully        positive
## 7240                   glimmer        positive
## 7241                glimmering        positive
## 7242                   glisten        positive
## 7243                glistening        positive
## 7244                   glitter        positive
## 7245                     glitz        positive
## 7246                   glorify        positive
## 7247                  glorious        positive
## 7248                gloriously        positive
## 7249                     glory        positive
## 7250                      glow        positive
## 7251                   glowing        positive
## 7252                 glowingly        positive
## 7253                 god given        positive
## 7254                  god send        positive
## 7255                   godlike        positive
## 7256                   godsend        positive
## 7257                      gold        positive
## 7258                    golden        positive
## 7259                      good        positive
## 7260                    goodly        positive
## 7261                  goodness        positive
## 7262                  goodwill        positive
## 7263                     goood        positive
## 7264                    gooood        positive
## 7265                  gorgeous        positive
## 7266                gorgeously        positive
## 7267                     grace        positive
## 7268                  graceful        positive
## 7269                gracefully        positive
## 7270                  gracious        positive
## 7271                graciously        positive
## 7272              graciousness        positive
## 7273                     grand        positive
## 7274                  grandeur        positive
## 7275                  grateful        positive
## 7276                gratefully        positive
## 7277             gratification        positive
## 7278                 gratified        positive
## 7279                 gratifies        positive
## 7280                   gratify        positive
## 7281                gratifying        positive
## 7282              gratifyingly        positive
## 7283                 gratitude        positive
## 7284                     great        positive
## 7285                  greatest        positive
## 7286                 greatness        positive
## 7287                      grin        positive
## 7288            groundbreaking        positive
## 7289                 guarantee        positive
## 7290                  guidance        positive
## 7291                 guiltless        positive
## 7292                  gumption        positive
## 7293                      gush        positive
## 7294                     gusto        positive
## 7295                     gutsy        positive
## 7296                      hail        positive
## 7297                   halcyon        positive
## 7298                      hale        positive
## 7299                  hallmark        positive
## 7300                 hallmarks        positive
## 7301                  hallowed        positive
## 7302                   handier        positive
## 7303                   handily        positive
## 7304                hands down        positive
## 7305                  handsome        positive
## 7306                handsomely        positive
## 7307                     handy        positive
## 7308                   happier        positive
## 7309                   happily        positive
## 7310                 happiness        positive
## 7311                     happy        positive
## 7312              hard working        positive
## 7313                   hardier        positive
## 7314                     hardy        positive
## 7315                  harmless        positive
## 7316                harmonious        positive
## 7317              harmoniously        positive
## 7318                 harmonize        positive
## 7319                   harmony        positive
## 7320                   headway        positive
## 7321                      heal        positive
## 7322                 healthful        positive
## 7323                   healthy        positive
## 7324                   hearten        positive
## 7325                heartening        positive
## 7326                 heartfelt        positive
## 7327                  heartily        positive
## 7328              heartwarming        positive
## 7329                    heaven        positive
## 7330                  heavenly        positive
## 7331                    helped        positive
## 7332                   helpful        positive
## 7333                   helping        positive
## 7334                      hero        positive
## 7335                    heroic        positive
## 7336                heroically        positive
## 7337                   heroine        positive
## 7338                   heroize        positive
## 7339                     heros        positive
## 7340              high quality        positive
## 7341             high spirited        positive
## 7342                 hilarious        positive
## 7343                      holy        positive
## 7344                    homage        positive
## 7345                    honest        positive
## 7346                   honesty        positive
## 7347                     honor        positive
## 7348                 honorable        positive
## 7349                   honored        positive
## 7350                  honoring        positive
## 7351                    hooray        positive
## 7352                   hopeful        positive
## 7353                hospitable        positive
## 7354                       hot        positive
## 7355                   hotcake        positive
## 7356                  hotcakes        positive
## 7357                   hottest        positive
## 7358                       hug        positive
## 7359                    humane        positive
## 7360                    humble        positive
## 7361                  humility        positive
## 7362                     humor        positive
## 7363                  humorous        positive
## 7364                humorously        positive
## 7365                    humour        positive
## 7366                 humourous        positive
## 7367                     ideal        positive
## 7368                  idealize        positive
## 7369                   ideally        positive
## 7370                      idol        positive
## 7371                   idolize        positive
## 7372                  idolized        positive
## 7373                   idyllic        positive
## 7374                illuminate        positive
## 7375                illuminati        positive
## 7376              illuminating        positive
## 7377                  illumine        positive
## 7378               illustrious        positive
## 7379                       ilu        positive
## 7380                 imaculate        positive
## 7381               imaginative        positive
## 7382                immaculate        positive
## 7383              immaculately        positive
## 7384                   immense        positive
## 7385                 impartial        positive
## 7386              impartiality        positive
## 7387               impartially        positive
## 7388               impassioned        positive
## 7389                impeccable        positive
## 7390                impeccably        positive
## 7391                 important        positive
## 7392                   impress        positive
## 7393                 impressed        positive
## 7394                 impresses        positive
## 7395                impressive        positive
## 7396              impressively        positive
## 7397            impressiveness        positive
## 7398                   improve        positive
## 7399                  improved        positive
## 7400               improvement        positive
## 7401              improvements        positive
## 7402                  improves        positive
## 7403                 improving        positive
## 7404                incredible        positive
## 7405                incredibly        positive
## 7406                  indebted        positive
## 7407            individualized        positive
## 7408                indulgence        positive
## 7409                 indulgent        positive
## 7410               industrious        positive
## 7411               inestimable        positive
## 7412               inestimably        positive
## 7413               inexpensive        positive
## 7414             infallibility        positive
## 7415                infallible        positive
## 7416                infallibly        positive
## 7417               influential        positive
## 7418                 ingenious        positive
## 7419               ingeniously        positive
## 7420                 ingenuity        positive
## 7421                 ingenuous        positive
## 7422               ingenuously        positive
## 7423                 innocuous        positive
## 7424                innovation        positive
## 7425                innovative        positive
## 7426                 inpressed        positive
## 7427                insightful        positive
## 7428              insightfully        positive
## 7429               inspiration        positive
## 7430             inspirational        positive
## 7431                   inspire        positive
## 7432                 inspiring        positive
## 7433                 instantly        positive
## 7434               instructive        positive
## 7435              instrumental        positive
## 7436                  integral        positive
## 7437                integrated        positive
## 7438              intelligence        positive
## 7439               intelligent        positive
## 7440              intelligible        positive
## 7441               interesting        positive
## 7442                 interests        positive
## 7443                  intimacy        positive
## 7444                  intimate        positive
## 7445                 intricate        positive
## 7446                  intrigue        positive
## 7447                intriguing        positive
## 7448              intriguingly        positive
## 7449                 intuitive        positive
## 7450                invaluable        positive
## 7451              invaluablely        positive
## 7452                 inventive        positive
## 7453                invigorate        positive
## 7454              invigorating        positive
## 7455             invincibility        positive
## 7456                invincible        positive
## 7457                inviolable        positive
## 7458                 inviolate        positive
## 7459              invulnerable        positive
## 7460             irreplaceable        positive
## 7461            irreproachable        positive
## 7462              irresistible        positive
## 7463              irresistibly        positive
## 7464                issue free        positive
## 7465               jaw droping        positive
## 7466              jaw dropping        positive
## 7467                   jollify        positive
## 7468                     jolly        positive
## 7469                    jovial        positive
## 7470                       joy        positive
## 7471                    joyful        positive
## 7472                  joyfully        positive
## 7473                    joyous        positive
## 7474                  joyously        positive
## 7475                  jubilant        positive
## 7476                jubilantly        positive
## 7477                  jubilate        positive
## 7478                jubilation        positive
## 7479                 jubiliant        positive
## 7480                 judicious        positive
## 7481                    justly        positive
## 7482                      keen        positive
## 7483                    keenly        positive
## 7484                  keenness        positive
## 7485              kid friendly        positive
## 7486                kindliness        positive
## 7487                    kindly        positive
## 7488                  kindness        positive
## 7489             knowledgeable        positive
## 7490                     kudos        positive
## 7491            large capacity        positive
## 7492                      laud        positive
## 7493                  laudable        positive
## 7494                  laudably        positive
## 7495                    lavish        positive
## 7496                  lavishly        positive
## 7497               law abiding        positive
## 7498                    lawful        positive
## 7499                  lawfully        positive
## 7500                      lead        positive
## 7501                   leading        positive
## 7502                     leads        positive
## 7503                      lean        positive
## 7504                       led        positive
## 7505                 legendary        positive
## 7506                  leverage        positive
## 7507                    levity        positive
## 7508                  liberate        positive
## 7509                liberation        positive
## 7510                   liberty        positive
## 7511                 lifesaver        positive
## 7512             light hearted        positive
## 7513                   lighter        positive
## 7514                   likable        positive
## 7515                      like        positive
## 7516                     liked        positive
## 7517                     likes        positive
## 7518                    liking        positive
## 7519               lionhearted        positive
## 7520                    lively        positive
## 7521                   logical        positive
## 7522              long lasting        positive
## 7523                   lovable        positive
## 7524                   lovably        positive
## 7525                      love        positive
## 7526                     loved        positive
## 7527                loveliness        positive
## 7528                    lovely        positive
## 7529                     lover        positive
## 7530                     loves        positive
## 7531                    loving        positive
## 7532                  low cost        positive
## 7533                 low price        positive
## 7534                low priced        positive
## 7535                  low risk        positive
## 7536              lower priced        positive
## 7537                     loyal        positive
## 7538                   loyalty        positive
## 7539                     lucid        positive
## 7540                   lucidly        positive
## 7541                      luck        positive
## 7542                   luckier        positive
## 7543                  luckiest        positive
## 7544                 luckiness        positive
## 7545                     lucky        positive
## 7546                 lucrative        positive
## 7547                  luminous        positive
## 7548                      lush        positive
## 7549                    luster        positive
## 7550                  lustrous        positive
## 7551                 luxuriant        positive
## 7552                 luxuriate        positive
## 7553                 luxurious        positive
## 7554               luxuriously        positive
## 7555                    luxury        positive
## 7556                   lyrical        positive
## 7557                     magic        positive
## 7558                   magical        positive
## 7559               magnanimous        positive
## 7560             magnanimously        positive
## 7561              magnificence        positive
## 7562               magnificent        positive
## 7563             magnificently        positive
## 7564                  majestic        positive
## 7565                   majesty        positive
## 7566                manageable        positive
## 7567              maneuverable        positive
## 7568                    marvel        positive
## 7569                  marveled        positive
## 7570                 marvelled        positive
## 7571                marvellous        positive
## 7572                 marvelous        positive
## 7573               marvelously        positive
## 7574             marvelousness        positive
## 7575                   marvels        positive
## 7576                    master        positive
## 7577                 masterful        positive
## 7578               masterfully        positive
## 7579               masterpiece        positive
## 7580              masterpieces        positive
## 7581                   masters        positive
## 7582                   mastery        positive
## 7583                 matchless        positive
## 7584                    mature        positive
## 7585                  maturely        positive
## 7586                  maturity        positive
## 7587                meaningful        positive
## 7588                 memorable        positive
## 7589                  merciful        positive
## 7590                mercifully        positive
## 7591                     mercy        positive
## 7592                     merit        positive
## 7593               meritorious        positive
## 7594                   merrily        positive
## 7595                 merriment        positive
## 7596                 merriness        positive
## 7597                     merry        positive
## 7598                 mesmerize        positive
## 7599                mesmerized        positive
## 7600                mesmerizes        positive
## 7601               mesmerizing        positive
## 7602             mesmerizingly        positive
## 7603                meticulous        positive
## 7604              meticulously        positive
## 7605                  mightily        positive
## 7606                    mighty        positive
## 7607              mind blowing        positive
## 7608                   miracle        positive
## 7609                  miracles        positive
## 7610                miraculous        positive
## 7611              miraculously        positive
## 7612            miraculousness        positive
## 7613                    modern        positive
## 7614                    modest        positive
## 7615                   modesty        positive
## 7616                 momentous        positive
## 7617                monumental        positive
## 7618              monumentally        positive
## 7619                  morality        positive
## 7620                 motivated        positive
## 7621             multi purpose        positive
## 7622                 navigable        positive
## 7623                      neat        positive
## 7624                   neatest        positive
## 7625                    neatly        positive
## 7626                      nice        positive
## 7627                    nicely        positive
## 7628                     nicer        positive
## 7629                    nicest        positive
## 7630                     nifty        positive
## 7631                    nimble        positive
## 7632                     noble        positive
## 7633                     nobly        positive
## 7634                 noiseless        positive
## 7635              non violence        positive
## 7636               non violent        positive
## 7637                   notably        positive
## 7638                noteworthy        positive
## 7639                   nourish        positive
## 7640                nourishing        positive
## 7641               nourishment        positive
## 7642                   novelty        positive
## 7643                 nurturing        positive
## 7644                     oasis        positive
## 7645                 obsession        positive
## 7646                obsessions        positive
## 7647                obtainable        positive
## 7648                    openly        positive
## 7649                  openness        positive
## 7650                   optimal        positive
## 7651                  optimism        positive
## 7652                optimistic        positive
## 7653                   opulent        positive
## 7654                   orderly        positive
## 7655               originality        positive
## 7656                     outdo        positive
## 7657                   outdone        positive
## 7658                outperform        positive
## 7659              outperformed        positive
## 7660             outperforming        positive
## 7661               outperforms        positive
## 7662                  outshine        positive
## 7663                  outshone        positive
## 7664                  outsmart        positive
## 7665               outstanding        positive
## 7666             outstandingly        positive
## 7667                  outstrip        positive
## 7668                    outwit        positive
## 7669                   ovation        positive
## 7670                 overjoyed        positive
## 7671                  overtake        positive
## 7672                 overtaken        positive
## 7673                 overtakes        positive
## 7674                overtaking        positive
## 7675                  overtook        positive
## 7676                  overture        positive
## 7677                 pain free        positive
## 7678                  painless        positive
## 7679                painlessly        positive
## 7680                  palatial        positive
## 7681                    pamper        positive
## 7682                  pampered        positive
## 7683                pamperedly        positive
## 7684              pamperedness        positive
## 7685                   pampers        positive
## 7686                 panoramic        positive
## 7687                  paradise        positive
## 7688                 paramount        positive
## 7689                    pardon        positive
## 7690                   passion        positive
## 7691                passionate        positive
## 7692              passionately        positive
## 7693                  patience        positive
## 7694                   patient        positive
## 7695                 patiently        positive
## 7696                   patriot        positive
## 7697                 patriotic        positive
## 7698                     peace        positive
## 7699                 peaceable        positive
## 7700                  peaceful        positive
## 7701                peacefully        positive
## 7702              peacekeepers        positive
## 7703                     peach        positive
## 7704                  peerless        positive
## 7705                       pep        positive
## 7706                    pepped        positive
## 7707                   pepping        positive
## 7708                     peppy        positive
## 7709                      peps        positive
## 7710                   perfect        positive
## 7711                perfection        positive
## 7712                 perfectly        positive
## 7713               permissible        positive
## 7714              perseverance        positive
## 7715                 persevere        positive
## 7716                personages        positive
## 7717              personalized        positive
## 7718                phenomenal        positive
## 7719              phenomenally        positive
## 7720               picturesque        positive
## 7721                     piety        positive
## 7722                  pinnacle        positive
## 7723                   playful        positive
## 7724                 playfully        positive
## 7725                  pleasant        positive
## 7726                pleasantly        positive
## 7727                   pleased        positive
## 7728                   pleases        positive
## 7729                  pleasing        positive
## 7730                pleasingly        positive
## 7731               pleasurable        positive
## 7732               pleasurably        positive
## 7733                  pleasure        positive
## 7734                 plentiful        positive
## 7735                    pluses        positive
## 7736                     plush        positive
## 7737                   plusses        positive
## 7738                    poetic        positive
## 7739                 poeticize        positive
## 7740                  poignant        positive
## 7741                     poise        positive
## 7742                    poised        positive
## 7743                  polished        positive
## 7744                    polite        positive
## 7745                politeness        positive
## 7746                   popular        positive
## 7747                  portable        positive
## 7748                      posh        positive
## 7749                  positive        positive
## 7750                positively        positive
## 7751                 positives        positive
## 7752                  powerful        positive
## 7753                powerfully        positive
## 7754                    praise        positive
## 7755              praiseworthy        positive
## 7756                  praising        positive
## 7757               pre eminent        positive
## 7758                  precious        positive
## 7759                   precise        positive
## 7760                 precisely        positive
## 7761                preeminent        positive
## 7762                    prefer        positive
## 7763                preferable        positive
## 7764                preferably        positive
## 7765                  prefered        positive
## 7766                  preferes        positive
## 7767                preferring        positive
## 7768                   prefers        positive
## 7769                   premier        positive
## 7770                  prestige        positive
## 7771               prestigious        positive
## 7772                  prettily        positive
## 7773                    pretty        positive
## 7774                 priceless        positive
## 7775                     pride        positive
## 7776                principled        positive
## 7777                 privilege        positive
## 7778                privileged        positive
## 7779                     prize        positive
## 7780                 proactive        positive
## 7781              problem free        positive
## 7782            problem solver        positive
## 7783                prodigious        positive
## 7784              prodigiously        positive
## 7785                   prodigy        positive
## 7786                productive        positive
## 7787              productively        positive
## 7788                proficient        positive
## 7789              proficiently        positive
## 7790                  profound        positive
## 7791                profoundly        positive
## 7792                   profuse        positive
## 7793                 profusion        positive
## 7794                  progress        positive
## 7795               progressive        positive
## 7796                  prolific        positive
## 7797                prominence        positive
## 7798                 prominent        positive
## 7799                   promise        positive
## 7800                  promised        positive
## 7801                  promises        positive
## 7802                 promising        positive
## 7803                  promoter        positive
## 7804                    prompt        positive
## 7805                  promptly        positive
## 7806                    proper        positive
## 7807                  properly        positive
## 7808                propitious        positive
## 7809              propitiously        positive
## 7810                      pros        positive
## 7811                   prosper        positive
## 7812                prosperity        positive
## 7813                prosperous        positive
## 7814                  prospros        positive
## 7815                   protect        positive
## 7816                protection        positive
## 7817                protective        positive
## 7818                     proud        positive
## 7819                    proven        positive
## 7820                    proves        positive
## 7821                providence        positive
## 7822                   proving        positive
## 7823                   prowess        positive
## 7824                  prudence        positive
## 7825                   prudent        positive
## 7826                 prudently        positive
## 7827                  punctual        positive
## 7828                      pure        positive
## 7829                    purify        positive
## 7830                purposeful        positive
## 7831                    quaint        positive
## 7832                 qualified        positive
## 7833                   qualify        positive
## 7834                   quicker        positive
## 7835                     quiet        positive
## 7836                   quieter        positive
## 7837                  radiance        positive
## 7838                   radiant        positive
## 7839                     rapid        positive
## 7840                   rapport        positive
## 7841                      rapt        positive
## 7842                   rapture        positive
## 7843                raptureous        positive
## 7844              raptureously        positive
## 7845                 rapturous        positive
## 7846               rapturously        positive
## 7847                  rational        positive
## 7848               razor sharp        positive
## 7849                 reachable        positive
## 7850                  readable        positive
## 7851                   readily        positive
## 7852                     ready        positive
## 7853                  reaffirm        positive
## 7854             reaffirmation        positive
## 7855                 realistic        positive
## 7856                realizable        positive
## 7857                reasonable        positive
## 7858                reasonably        positive
## 7859                  reasoned        positive
## 7860               reassurance        positive
## 7861                  reassure        positive
## 7862                 receptive        positive
## 7863                   reclaim        positive
## 7864                  recomend        positive
## 7865                 recommend        positive
## 7866            recommendation        positive
## 7867           recommendations        positive
## 7868               recommended        positive
## 7869                 reconcile        positive
## 7870            reconciliation        positive
## 7871            record setting        positive
## 7872                   recover        positive
## 7873                  recovery        positive
## 7874             rectification        positive
## 7875                   rectify        positive
## 7876                rectifying        positive
## 7877                    redeem        positive
## 7878                 redeeming        positive
## 7879                redemption        positive
## 7880                    refine        positive
## 7881                   refined        positive
## 7882                refinement        positive
## 7883                    reform        positive
## 7884                  reformed        positive
## 7885                 reforming        positive
## 7886                   reforms        positive
## 7887                   refresh        positive
## 7888                 refreshed        positive
## 7889                refreshing        positive
## 7890                    refund        positive
## 7891                  refunded        positive
## 7892                     regal        positive
## 7893                   regally        positive
## 7894                    regard        positive
## 7895                   rejoice        positive
## 7896                 rejoicing        positive
## 7897               rejoicingly        positive
## 7898                rejuvenate        positive
## 7899               rejuvenated        positive
## 7900              rejuvenating        positive
## 7901                   relaxed        positive
## 7902                    relent        positive
## 7903                  reliable        positive
## 7904                  reliably        positive
## 7905                    relief        positive
## 7906                    relish        positive
## 7907                remarkable        positive
## 7908                remarkably        positive
## 7909                    remedy        positive
## 7910                 remission        positive
## 7911                remunerate        positive
## 7912               renaissance        positive
## 7913                   renewed        positive
## 7914                    renown        positive
## 7915                  renowned        positive
## 7916               replaceable        positive
## 7917                 reputable        positive
## 7918                reputation        positive
## 7919                 resilient        positive
## 7920                  resolute        positive
## 7921                   resound        positive
## 7922                resounding        positive
## 7923               resourceful        positive
## 7924           resourcefulness        positive
## 7925                   respect        positive
## 7926               respectable        positive
## 7927                respectful        positive
## 7928              respectfully        positive
## 7929                   respite        positive
## 7930               resplendent        positive
## 7931               responsibly        positive
## 7932                responsive        positive
## 7933                   restful        positive
## 7934                  restored        positive
## 7935               restructure        positive
## 7936              restructured        positive
## 7937             restructuring        positive
## 7938               retractable        positive
## 7939                     revel        positive
## 7940                revelation        positive
## 7941                    revere        positive
## 7942                 reverence        positive
## 7943                  reverent        positive
## 7944                reverently        positive
## 7945                revitalize        positive
## 7946                   revival        positive
## 7947                    revive        positive
## 7948                   revives        positive
## 7949             revolutionary        positive
## 7950             revolutionize        positive
## 7951            revolutionized        positive
## 7952            revolutionizes        positive
## 7953                    reward        positive
## 7954                 rewarding        positive
## 7955               rewardingly        positive
## 7956                      rich        positive
## 7957                    richer        positive
## 7958                    richly        positive
## 7959                  richness        positive
## 7960                     right        positive
## 7961                   righten        positive
## 7962                 righteous        positive
## 7963               righteously        positive
## 7964             righteousness        positive
## 7965                  rightful        positive
## 7966                rightfully        positive
## 7967                   rightly        positive
## 7968                 rightness        positive
## 7969                 risk free        positive
## 7970                    robust        positive
## 7971                 rock star        positive
## 7972                rock stars        positive
## 7973                  rockstar        positive
## 7974                 rockstars        positive
## 7975                  romantic        positive
## 7976              romantically        positive
## 7977               romanticize        positive
## 7978                   roomier        positive
## 7979                     roomy        positive
## 7980                      rosy        positive
## 7981                      safe        positive
## 7982                    safely        positive
## 7983                  sagacity        positive
## 7984                    sagely        positive
## 7985                     saint        positive
## 7986               saintliness        positive
## 7987                   saintly        positive
## 7988                  salutary        positive
## 7989                    salute        positive
## 7990                      sane        positive
## 7991            satisfactorily        positive
## 7992              satisfactory        positive
## 7993                 satisfied        positive
## 7994                 satisfies        positive
## 7995                   satisfy        positive
## 7996                satisfying        positive
## 7997                satisified        positive
## 7998                     saver        positive
## 7999                   savings        positive
## 8000                    savior        positive
## 8001                     savvy        positive
## 8002                    scenic        positive
## 8003                  seamless        positive
## 8004                  seasoned        positive
## 8005                    secure        positive
## 8006                  securely        positive
## 8007                 selective        positive
## 8008        self determination        positive
## 8009              self respect        positive
## 8010         self satisfaction        positive
## 8011          self sufficiency        positive
## 8012           self sufficient        positive
## 8013                 sensation        positive
## 8014               sensational        positive
## 8015             sensationally        positive
## 8016                sensations        positive
## 8017                  sensible        positive
## 8018                  sensibly        positive
## 8019                 sensitive        positive
## 8020                    serene        positive
## 8021                  serenity        positive
## 8022                      sexy        positive
## 8023                     sharp        positive
## 8024                   sharper        positive
## 8025                  sharpest        positive
## 8026                shimmering        positive
## 8027              shimmeringly        positive
## 8028                     shine        positive
## 8029                     shiny        positive
## 8030               significant        positive
## 8031                    silent        positive
## 8032                   simpler        positive
## 8033                  simplest        positive
## 8034                simplified        positive
## 8035                simplifies        positive
## 8036                  simplify        positive
## 8037               simplifying        positive
## 8038                   sincere        positive
## 8039                 sincerely        positive
## 8040                 sincerity        positive
## 8041                     skill        positive
## 8042                   skilled        positive
## 8043                  skillful        positive
## 8044                skillfully        positive
## 8045                   slammin        positive
## 8046                     sleek        positive
## 8047                     slick        positive
## 8048                     smart        positive
## 8049                   smarter        positive
## 8050                  smartest        positive
## 8051                   smartly        positive
## 8052                     smile        positive
## 8053                    smiles        positive
## 8054                   smiling        positive
## 8055                 smilingly        positive
## 8056                   smitten        positive
## 8057                    smooth        positive
## 8058                  smoother        positive
## 8059                  smoothes        positive
## 8060                 smoothest        positive
## 8061                  smoothly        positive
## 8062                    snappy        positive
## 8063                    snazzy        positive
## 8064                  sociable        positive
## 8065                      soft        positive
## 8066                    softer        positive
## 8067                    solace        positive
## 8068                solicitous        positive
## 8069              solicitously        positive
## 8070                     solid        positive
## 8071                solidarity        positive
## 8072                    soothe        positive
## 8073                soothingly        positive
## 8074             sophisticated        positive
## 8075                   soulful        positive
## 8076                   soundly        positive
## 8077                 soundness        positive
## 8078                  spacious        positive
## 8079                   sparkle        positive
## 8080                 sparkling        positive
## 8081               spectacular        positive
## 8082             spectacularly        positive
## 8083                  speedily        positive
## 8084                    speedy        positive
## 8085                 spellbind        positive
## 8086              spellbinding        positive
## 8087            spellbindingly        positive
## 8088                spellbound        positive
## 8089                  spirited        positive
## 8090                 spiritual        positive
## 8091                  splendid        positive
## 8092                splendidly        positive
## 8093                  splendor        positive
## 8094               spontaneous        positive
## 8095                    sporty        positive
## 8096                  spotless        positive
## 8097                 sprightly        positive
## 8098                 stability        positive
## 8099                 stabilize        positive
## 8100                    stable        positive
## 8101                 stainless        positive
## 8102                  standout        positive
## 8103          state of the art        positive
## 8104                   stately        positive
## 8105                statuesque        positive
## 8106                   staunch        positive
## 8107                 staunchly        positive
## 8108               staunchness        positive
## 8109                 steadfast        positive
## 8110               steadfastly        positive
## 8111             steadfastness        positive
## 8112                 steadiest        positive
## 8113                steadiness        positive
## 8114                    steady        positive
## 8115                   stellar        positive
## 8116                 stellarly        positive
## 8117                 stimulate        positive
## 8118                stimulates        positive
## 8119               stimulating        positive
## 8120               stimulative        positive
## 8121                stirringly        positive
## 8122                straighten        positive
## 8123           straightforward        positive
## 8124               streamlined        positive
## 8125                  striking        positive
## 8126                strikingly        positive
## 8127                  striving        positive
## 8128                    strong        positive
## 8129                  stronger        positive
## 8130                 strongest        positive
## 8131                   stunned        positive
## 8132                  stunning        positive
## 8133                stunningly        positive
## 8134                stupendous        positive
## 8135              stupendously        positive
## 8136                  sturdier        positive
## 8137                    sturdy        positive
## 8138                   stylish        positive
## 8139                 stylishly        positive
## 8140                  stylized        positive
## 8141                     suave        positive
## 8142                   suavely        positive
## 8143                   sublime        positive
## 8144                 subsidize        positive
## 8145                subsidized        positive
## 8146                subsidizes        positive
## 8147               subsidizing        positive
## 8148               substantive        positive
## 8149                   succeed        positive
## 8150                 succeeded        positive
## 8151                succeeding        positive
## 8152                  succeeds        positive
## 8153                    succes        positive
## 8154                   success        positive
## 8155                 successes        positive
## 8156                successful        positive
## 8157              successfully        positive
## 8158                   suffice        positive
## 8159                  sufficed        positive
## 8160                  suffices        positive
## 8161                sufficient        positive
## 8162              sufficiently        positive
## 8163                  suitable        positive
## 8164                 sumptuous        positive
## 8165               sumptuously        positive
## 8166             sumptuousness        positive
## 8167                     super        positive
## 8168                    superb        positive
## 8169                  superbly        positive
## 8170                  superior        positive
## 8171               superiority        positive
## 8172                    supple        positive
## 8173                   support        positive
## 8174                 supported        positive
## 8175                 supporter        positive
## 8176                supporting        positive
## 8177                supportive        positive
## 8178                  supports        positive
## 8179                 supremacy        positive
## 8180                   supreme        positive
## 8181                 supremely        positive
## 8182                    supurb        positive
## 8183                  supurbly        positive
## 8184                  surmount        positive
## 8185                   surpass        positive
## 8186                   surreal        positive
## 8187                  survival        positive
## 8188                  survivor        positive
## 8189            sustainability        positive
## 8190               sustainable        positive
## 8191                     swank        positive
## 8192                  swankier        positive
## 8193                 swankiest        positive
## 8194                    swanky        positive
## 8195                  sweeping        positive
## 8196                     sweet        positive
## 8197                   sweeten        positive
## 8198                sweetheart        positive
## 8199                   sweetly        positive
## 8200                 sweetness        positive
## 8201                     swift        positive
## 8202                 swiftness        positive
## 8203                    talent        positive
## 8204                  talented        positive
## 8205                   talents        positive
## 8206                 tantalize        positive
## 8207               tantalizing        positive
## 8208             tantalizingly        positive
## 8209                     tempt        positive
## 8210                  tempting        positive
## 8211                temptingly        positive
## 8212                 tenacious        positive
## 8213               tenaciously        positive
## 8214                  tenacity        positive
## 8215                    tender        positive
## 8216                  tenderly        positive
## 8217                  terrific        positive
## 8218              terrifically        positive
## 8219                     thank        positive
## 8220                  thankful        positive
## 8221                   thinner        positive
## 8222                thoughtful        positive
## 8223              thoughtfully        positive
## 8224            thoughtfulness        positive
## 8225                    thrift        positive
## 8226                   thrifty        positive
## 8227                    thrill        positive
## 8228                  thrilled        positive
## 8229                 thrilling        positive
## 8230               thrillingly        positive
## 8231                   thrills        positive
## 8232                    thrive        positive
## 8233                  thriving        positive
## 8234                  thumb up        positive
## 8235                 thumbs up        positive
## 8236                    tickle        positive
## 8237                      tidy        positive
## 8238              time honored        positive
## 8239                    timely        positive
## 8240                    tingle        positive
## 8241                 titillate        positive
## 8242               titillating        positive
## 8243             titillatingly        positive
## 8244              togetherness        positive
## 8245                 tolerable        positive
## 8246                 toll free        positive
## 8247                       top        positive
## 8248                 top notch        positive
## 8249               top quality        positive
## 8250                  topnotch        positive
## 8251                      tops        positive
## 8252                     tough        positive
## 8253                   tougher        positive
## 8254                  toughest        positive
## 8255                  traction        positive
## 8256                  tranquil        positive
## 8257               tranquility        positive
## 8258               transparent        positive
## 8259                  treasure        positive
## 8260              tremendously        positive
## 8261                    trendy        positive
## 8262                   triumph        positive
## 8263                 triumphal        positive
## 8264                triumphant        positive
## 8265              triumphantly        positive
## 8266                 trivially        positive
## 8267                    trophy        positive
## 8268              trouble free        positive
## 8269                     trump        positive
## 8270                   trumpet        positive
## 8271                     trust        positive
## 8272                   trusted        positive
## 8273                  trusting        positive
## 8274                trustingly        positive
## 8275           trustworthiness        positive
## 8276               trustworthy        positive
## 8277                    trusty        positive
## 8278                  truthful        positive
## 8279                truthfully        positive
## 8280              truthfulness        positive
## 8281                   twinkly        positive
## 8282               ultra crisp        positive
## 8283                 unabashed        positive
## 8284               unabashedly        positive
## 8285                unaffected        positive
## 8286              unassailable        positive
## 8287                unbeatable        positive
## 8288                  unbiased        positive
## 8289                   unbound        positive
## 8290             uncomplicated        positive
## 8291             unconditional        positive
## 8292                 undamaged        positive
## 8293                 undaunted        positive
## 8294            understandable        positive
## 8295              undisputable        positive
## 8296              undisputably        positive
## 8297                undisputed        positive
## 8298              unencumbered        positive
## 8299               unequivocal        positive
## 8300             unequivocally        positive
## 8301                   unfazed        positive
## 8302                unfettered        positive
## 8303             unforgettable        positive
## 8304                     unity        positive
## 8305                 unlimited        positive
## 8306                 unmatched        positive
## 8307              unparalleled        positive
## 8308            unquestionable        positive
## 8309            unquestionably        positive
## 8310                    unreal        positive
## 8311              unrestricted        positive
## 8312                 unrivaled        positive
## 8313                 unselfish        positive
## 8314                unwavering        positive
## 8315                    upbeat        positive
## 8316                upgradable        positive
## 8317               upgradeable        positive
## 8318                  upgraded        positive
## 8319                    upheld        positive
## 8320                    uphold        positive
## 8321                    uplift        positive
## 8322                 uplifting        positive
## 8323               upliftingly        positive
## 8324                upliftment        positive
## 8325                   upscale        positive
## 8326                    usable        positive
## 8327                   useable        positive
## 8328                    useful        positive
## 8329             user friendly        positive
## 8330          user replaceable        positive
## 8331                   valiant        positive
## 8332                 valiantly        positive
## 8333                     valor        positive
## 8334                  valuable        positive
## 8335                   variety        positive
## 8336                  venerate        positive
## 8337                verifiable        positive
## 8338                 veritable        positive
## 8339                 versatile        positive
## 8340               versatility        positive
## 8341                   vibrant        positive
## 8342                 vibrantly        positive
## 8343                victorious        positive
## 8344                   victory        positive
## 8345                  viewable        positive
## 8346                 vigilance        positive
## 8347                  vigilant        positive
## 8348                    virtue        positive
## 8349                  virtuous        positive
## 8350                virtuously        positive
## 8351                 visionary        positive
## 8352                 vivacious        positive
## 8353                     vivid        positive
## 8354                     vouch        positive
## 8355                 vouchsafe        positive
## 8356                      warm        positive
## 8357                    warmer        positive
## 8358               warmhearted        positive
## 8359                    warmly        positive
## 8360                    warmth        positive
## 8361                   wealthy        positive
## 8362                   welcome        positive
## 8363                      well        positive
## 8364              well backlit        positive
## 8365             well balanced        positive
## 8366              well behaved        positive
## 8367                well being        positive
## 8368                 well bred        positive
## 8369            well connected        positive
## 8370             well educated        positive
## 8371          well established        positive
## 8372             well informed        positive
## 8373          well intentioned        positive
## 8374                well known        positive
## 8375                 well made        positive
## 8376              well managed        positive
## 8377             well mannered        positive
## 8378           well positioned        positive
## 8379             well received        positive
## 8380             well regarded        positive
## 8381              well rounded        positive
## 8382                  well run        positive
## 8383              well wishers        positive
## 8384                 wellbeing        positive
## 8385                      whoa        positive
## 8386            wholeheartedly        positive
## 8387                 wholesome        positive
## 8388                     whooa        positive
## 8389                    whoooa        positive
## 8390                    wieldy        positive
## 8391                   willing        positive
## 8392                 willingly        positive
## 8393               willingness        positive
## 8394                       win        positive
## 8395                  windfall        positive
## 8396                  winnable        positive
## 8397                    winner        positive
## 8398                   winners        positive
## 8399                   winning        positive
## 8400                      wins        positive
## 8401                    wisdom        positive
## 8402                      wise        positive
## 8403                    wisely        positive
## 8404                     witty        positive
## 8405                       won        positive
## 8406                    wonder        positive
## 8407                 wonderful        positive
## 8408               wonderfully        positive
## 8409                 wonderous        positive
## 8410               wonderously        positive
## 8411                   wonders        positive
## 8412                  wondrous        positive
## 8413                       woo        positive
## 8414                      work        positive
## 8415                  workable        positive
## 8416                    worked        positive
## 8417                     works        positive
## 8418              world famous        positive
## 8419                     worth        positive
## 8420               worth while        positive
## 8421                worthiness        positive
## 8422                worthwhile        positive
## 8423                    worthy        positive
## 8424                       wow        positive
## 8425                     wowed        positive
## 8426                    wowing        positive
## 8427                      wows        positive
## 8428                       yay        positive
## 8429                  youthful        positive
## 8430                      zeal        positive
## 8431                    zenith        positive
## 8432                      zest        positive
## 8433                     zippy        positive
## 8434                   abolish           power
## 8435                accomplish           power
## 8436            accomplishment           power
## 8437                    accord           power
## 8438               achievement           power
## 8439              adjudication           power
## 8440                administer           power
## 8441            administration           power
## 8442            administrative           power
## 8443             administrator           power
## 8444                     admit           power
## 8445                  admonish           power
## 8446                   adviser           power
## 8447                   advisor           power
## 8448                  advocate           power
## 8449                    affirm           power
## 8450                    afford           power
## 8451                    agency           power
## 8452                  alliance           power
## 8453                     allot           power
## 8454                     allow           power
## 8455                  almighty           power
## 8456                 amazement           power
## 8457                   amazing           power
## 8458                ambassador           power
## 8459                  ambition           power
## 8460                 ambitious           power
## 8461                   amnesty           power
## 8462                   appoint           power
## 8463                 appraisal           power
## 8464               appropriate           power
## 8465             appropriation           power
## 8466                    ardent           power
## 8467               aristocracy           power
## 8468                aristocrat           power
## 8469              aristocratic           power
## 8470                       arm           power
## 8471                     armed           power
## 8472                      army           power
## 8473                   arrange           power
## 8474                    arrest           power
## 8475                 arrogance           power
## 8476                    assert           power
## 8477                  assessor           power
## 8478                    assign           power
## 8479                    assume           power
## 8480                    assure           power
## 8481                 assuredly           power
## 8482                   astound           power
## 8483                  attorney           power
## 8484                   auditor           power
## 8485             authoritarian           power
## 8486             authoritative           power
## 8487                 authority           power
## 8488                 authorize           power
## 8489                  autocrat           power
## 8490                autocratic           power
## 8491                autonomous           power
## 8492                     award           power
## 8493                        ax           power
## 8494                      back           power
## 8495                  backbone           power
## 8496                    ballot           power
## 8497                    banish           power
## 8498                banishment           power
## 8499                       bar           power
## 8500                      bear           power
## 8501                      beat           power
## 8502                   benefit           power
## 8503                    benign           power
## 8504                    bestow           power
## 8505                     bicep           power
## 8506                    bishop           power
## 8507                 blackmail           power
## 8508              bloodthirsty           power
## 8509                     board           power
## 8510                     boast           power
## 8511                  boastful           power
## 8512                      body           power
## 8513                  boldness           power
## 8514                      boot           power
## 8515                      boss           power
## 8516                      brag           power
## 8517                   bravado           power
## 8518                     brave           power
## 8519                   bravery           power
## 8520                    brazen           power
## 8521                     bring           power
## 8522                  campaign           power
## 8523                capability           power
## 8524                   capable           power
## 8525                  capacity           power
## 8526                capitalize           power
## 8527                   captain           power
## 8528                   capture           power
## 8529                      cast           power
## 8530                 celebrity           power
## 8531                    censor           power
## 8532                censorship           power
## 8533                   censure           power
## 8534               certificate           power
## 8535             certification           power
## 8536                   certify           power
## 8537                  chairman           power
## 8538                  chairmen           power
## 8539                     champ           power
## 8540                  champion           power
## 8541              championship           power
## 8542                chancellor           power
## 8543                   channel           power
## 8544                    charge           power
## 8545                  chastise           power
## 8546                     chide           power
## 8547                     chief           power
## 8548                  civilize           power
## 8549                     clash           power
## 8550                     clear           power
## 8551                     clout           power
## 8552                 coalition           power
## 8553                 cockiness           power
## 8554                     cocky           power
## 8555                    coerce           power
## 8556                  coercion           power
## 8557                  coercive           power
## 8558                    cogent           power
## 8559                    collar           power
## 8560                   colonel           power
## 8561                   command           power
## 8562                 commander           power
## 8563              commissioner           power
## 8564                 committee           power
## 8565              commonwealth           power
## 8566                    compel           power
## 8567                compulsion           power
## 8568                   conceit           power
## 8569             condescending           power
## 8570             condescension           power
## 8571                   condone           power
## 8572                 confident           power
## 8573                   confine           power
## 8574                confiscate           power
## 8575              confiscation           power
## 8576                  congress           power
## 8577               congressmen           power
## 8578                   conquer           power
## 8579                 conqueror           power
## 8580                 constable           power
## 8581                 constrain           power
## 8582                constraint           power
## 8583                   contest           power
## 8584                   control           power
## 8585                controller           power
## 8586                  convince           power
## 8587                 convinced           power
## 8588                coordinate           power
## 8589                       cop           power
## 8590                  corporal           power
## 8591                   council           power
## 8592                   counsel           power
## 8593                     court           power
## 8594                     cover           power
## 8595                     crown           power
## 8596                  crushing           power
## 8597                      curb           power
## 8598                      cure           power
## 8599                 dauntless           power
## 8600                      dean           power
## 8601                  decisive           power
## 8602                  delegate           power
## 8603                delegation           power
## 8604                    deluge           power
## 8605                    demand           power
## 8606                    demean           power
## 8607                  denounce           power
## 8608                    deploy           power
## 8609                    depose           power
## 8610                   deprive           power
## 8611                derogatory           power
## 8612                 designate           power
## 8613                desolation           power
## 8614               destruction           power
## 8615                    detain           power
## 8616                     deter           power
## 8617             determination           power
## 8618                 determine           power
## 8619                   dictate           power
## 8620                  dictator           power
## 8621               dictatorial           power
## 8622                 dignified           power
## 8623                 diplomacy           power
## 8624                diplomatic           power
## 8625                    direct           power
## 8626                 direction           power
## 8627                  director           power
## 8628                 discharge           power
## 8629                discipline           power
## 8630                   disdain           power
## 8631                   dismiss           power
## 8632                    dispel           power
## 8633                  dispense           power
## 8634                  displace           power
## 8635               distinguish           power
## 8636             distinguished           power
## 8637                 dominance           power
## 8638                  dominant           power
## 8639                  dominate           power
## 8640                domination           power
## 8641                     draft           power
## 8642                      draw           power
## 8643                     drive           power
## 8644                     drove           power
## 8645                    editor           power
## 8646                   educate           power
## 8647                  educated           power
## 8648                    effect           power
## 8649               egotistical           power
## 8650                     elder           power
## 8651                     elect           power
## 8652                  election           power
## 8653                 electoral           power
## 8654                     elite           power
## 8655              emancipation           power
## 8656                   embassy           power
## 8657                  eminence           power
## 8658                   eminent           power
## 8659                   emperor           power
## 8660                    employ           power
## 8661                  employer           power
## 8662                   empower           power
## 8663               empowerment           power
## 8664                  encroach           power
## 8665              encroachment           power
## 8666                   endorse           power
## 8667                   enforce           power
## 8668               enforcement           power
## 8669                   enslave           power
## 8670                    ensure           power
## 8671                  entangle           power
## 8672                   entitle           power
## 8673                 eradicate           power
## 8674                  esoteric           power
## 8675                 establish           power
## 8676                     evict           power
## 8677                     exact           power
## 8678                   examine           power
## 8679                  examiner           power
## 8680                   exclude           power
## 8681                 exclusion           power
## 8682                    excuse           power
## 8683                 executive           power
## 8684                    expert           power
## 8685                   exploit           power
## 8686               exterminate           power
## 8687             extermination           power
## 8688                    famous           power
## 8689                      feed           power
## 8690                     floor           power
## 8691                  flourish           power
## 8692                    forbid           power
## 8693                 forbidden           power
## 8694                     force           power
## 8695                formidable           power
## 8696                   fortify           power
## 8697                     found           power
## 8698                   founder           power
## 8699                      free           power
## 8700                      gall           power
## 8701                   general           power
## 8702                     giver           power
## 8703                   glorify           power
## 8704                       god           power
## 8705                   goddess           power
## 8706                   godlike           power
## 8707                 godliness           power
## 8708                    govern           power
## 8709                government           power
## 8710                  governor           power
## 8711                  gracious           power
## 8712                     grant           power
## 8713                     grasp           power
## 8714                 greatness           power
## 8715                      grip           power
## 8716                      grow           power
## 8717                 guarantee           power
## 8718                     guard           power
## 8719                  guidance           power
## 8720                     guide           power
## 8721                     gusto           power
## 8722                    hamper           power
## 8723                      hand           power
## 8724                    handle           power
## 8725                   haughty           power
## 8726                     haunt           power
## 8727                      have           power
## 8728                      head           power
## 8729              headquarters           power
## 8730                      heal           power
## 8731                      herd           power
## 8732                      hero           power
## 8733                    heroic           power
## 8734                   heroism           power
## 8735                      hire           power
## 8736                      hold           power
## 8737                     house           power
## 8738                  immortal           power
## 8739                    impact           power
## 8740                    impair           power
## 8741                     impel           power
## 8742            implementation           power
## 8743                    impose           power
## 8744                  imprison           power
## 8745                  impunity           power
## 8746               independent           power
## 8747          indispensability           power
## 8748               indomitable           power
## 8749                    induce           power
## 8750                 influence           power
## 8751               influential           power
## 8752                  initiate           power
## 8753                    insist           power
## 8754                insistence           power
## 8755                   inspect           power
## 8756                inspection           power
## 8757                  instruct           power
## 8758               instruction           power
## 8759                instructor           power
## 8760                intimidate           power
## 8761                invincible           power
## 8762                   involve           power
## 8763              invulnerable           power
## 8764                      jail           power
## 8765                     judge           power
## 8766                  judgment           power
## 8767                     junta           power
## 8768              jurisdiction           power
## 8769                     juror           power
## 8770                      jury           power
## 8771                   justice           power
## 8772                      keep           power
## 8773                    keeper           power
## 8774                      king           power
## 8775                      laid           power
## 8776                  landlord           power
## 8777                       lay           power
## 8778                      lead           power
## 8779                    leader           power
## 8780                leadership           power
## 8781                     leave           power
## 8782               legislation           power
## 8783               legislative           power
## 8784                legislator           power
## 8785                       let           power
## 8786                  liberate           power
## 8787                liberation           power
## 8788                   liberty           power
## 8789                lieutenant           power
## 8790                     limit           power
## 8791                      look           power
## 8792                      lord           power
## 8793                  maintain           power
## 8794                  majority           power
## 8795                      make           power
## 8796                    manage           power
## 8797                management           power
## 8798                   manager           power
## 8799                managerial           power
## 8800                manipulate           power
## 8801                  marshall           power
## 8802                    master           power
## 8803                 masterful           power
## 8804                       may           power
## 8805                     mayor           power
## 8806                    mentor           power
## 8807                 merciless           power
## 8808                     might           power
## 8809                    mighty           power
## 8810                  minister           power
## 8811                  ministry           power
## 8812                      mock           power
## 8813                   mockery           power
## 8814                   monitor           power
## 8815                  monopoly           power
## 8816                      move           power
## 8817                    muffle           power
## 8818                neutralize           power
## 8819                       nix           power
## 8820                  nobility           power
## 8821                  nobleman           power
## 8822                nomination           power
## 8823                      obey           power
## 8824                obliterate           power
## 8825                   officer           power
## 8826                  official           power
## 8827                 officiate           power
## 8828                   oppress           power
## 8829                oppression           power
## 8830                oppressive           power
## 8831                     order           power
## 8832                 ordinance           power
## 8833                  organize           power
## 8834                      oust           power
## 8835                    outfit           power
## 8836               overbearing           power
## 8837                  overcame           power
## 8838                  overcome           power
## 8839                 overpower           power
## 8840                   overrun           power
## 8841                  overseer           power
## 8842                 overthrow           power
## 8843                 overwhelm           power
## 8844              overwhelming           power
## 8845                    palace           power
## 8846                 paramount           power
## 8847                    pardon           power
## 8848                parliament           power
## 8849                      pass           power
## 8850                    patrol           power
## 8851                    patron           power
## 8852                 patronage           power
## 8853                 patronize           power
## 8854                permission           power
## 8855                    permit           power
## 8856                  persuade           power
## 8857                      pick           power
## 8858                  pitiless           power
## 8859                      pity           power
## 8860                    please           power
## 8861                    police           power
## 8862                 policeman           power
## 8863                 policemen           power
## 8864                politician           power
## 8865                   pompous           power
## 8866                      pope           power
## 8867                     posse           power
## 8868                   possess           power
## 8869                   potency           power
## 8870                     power           power
## 8871                  powerful           power
## 8872                  preacher           power
## 8873               predominate           power
## 8874                preeminent           power
## 8875                   preside           power
## 8876                presidency           power
## 8877                 president           power
## 8878              presidential           power
## 8879                     press           power
## 8880                  pressure           power
## 8881                  prestige           power
## 8882                   prevent           power
## 8883                prevention           power
## 8884                preventive           power
## 8885                    priest           power
## 8886                    prince           power
## 8887                 principal           power
## 8888                 privilege           power
## 8889                  proclaim           power
## 8890              proclamation           power
## 8891                   proctor           power
## 8892                 professor           power
## 8893                  prohibit           power
## 8894               prohibition           power
## 8895               prohibitive           power
## 8896                 prominent           power
## 8897                   promote           power
## 8898                    prompt           power
## 8899                 proponent           power
## 8900                proprietor           power
## 8901                   protect           power
## 8902                protection           power
## 8903                   provide           power
## 8904                providence           power
## 8905                    punish           power
## 8906                   quarter           power
## 8907                     queen           power
## 8908                     quiet           power
## 8909                  reaffirm           power
## 8910                  reassure           power
## 8911                   reclaim           power
## 8912                   recruit           power
## 8913               recruitment           power
## 8914                    rector           power
## 8915                     regal           power
## 8916                    regime           power
## 8917                  regulate           power
## 8918                 reinforce           power
## 8919                 reinstate           power
## 8920                relentless           power
## 8921                   relieve           power
## 8922                   repress           power
## 8923                   repulse           power
## 8924                   require           power
## 8925               requirement           power
## 8926                    rescue           power
## 8927               resplendent           power
## 8928            responsibility           power
## 8929               responsible           power
## 8930                  restrain           power
## 8931                 restraint           power
## 8932                  restrict           power
## 8933                      rich           power
## 8934                    riches           power
## 8935                  richness           power
## 8936                     right           power
## 8937                 righteous           power
## 8938             righteousness           power
## 8939                      rope           power
## 8940                     royal           power
## 8941                   royalty           power
## 8942                    rugged           power
## 8943                      rule           power
## 8944                     ruler           power
## 8945                       run           power
## 8946                 safeguard           power
## 8947                  sanction           power
## 8948                       say           power
## 8949                    school           power
## 8950                     scoff           power
## 8951                    select           power
## 8952            self-contained           power
## 8953                    senate           power
## 8954                   senator           power
## 8955                  sentence           power
## 8956                 sequester           power
## 8957                  sergeant           power
## 8958                    settle           power
## 8959                 shameless           power
## 8960                   shelter           power
## 8961                   sheriff           power
## 8962                    shield           power
## 8963                      ship           power
## 8964                      show           power
## 8965                      shut           power
## 8966                       sir           power
## 8967                   smother           power
## 8968                 sovereign           power
## 8969               sovereignty           power
## 8970                     spare           power
## 8971                     speak           power
## 8972                     spoke           power
## 8973                   sponsor           power
## 8974                      spur           power
## 8975                     squad           power
## 8976                 stabilize           power
## 8977                  standard           power
## 8978                     state           power
## 8979                   stately           power
## 8980                 statesman           power
## 8981                 statesmen           power
## 8982                statuesque           power
## 8983                    status           power
## 8984                   statute           power
## 8985                 statutory           power
## 8986                     steer           power
## 8987                      step           power
## 8988                    stifle           power
## 8989                     still           power
## 8990                 stimulate           power
## 8991                 stipulate           power
## 8992               stipulation           power
## 8993                      stop           power
## 8994                  strength           power
## 8995                strengthen           power
## 8996                    strict           power
## 8997                    strong           power
## 8998                     strut           power
## 8999                      stud           power
## 9000                    sturdy           power
## 9001                    subdue           power
## 9002                subversion           power
## 9003                   subvert           power
## 9004                  suffrage           power
## 9005                    summon           power
## 9006            superintendent           power
## 9007                  superior           power
## 9008               superiority           power
## 9009                    supply           power
## 9010                   support           power
## 9011                   suppose           power
## 9012               suppression           power
## 9013                 supremacy           power
## 9014                   supreme           power
## 9015                  surmount           power
## 9016                   surpass           power
## 9017              surveillance           power
## 9018                  survivor           power
## 9019                      take           power
## 9020                    taught           power
## 9021                     teach           power
## 9022                   teacher           power
## 9023                      tend           power
## 9024                      term           power
## 9025                      test           power
## 9026                    thwart           power
## 9027                      trap           power
## 9028                 treasurer           power
## 9029                   triumph           power
## 9030                 triumphal           power
## 9031                triumphant           power
## 9032                    trophy           power
## 9033                     trust           power
## 9034                       try           power
## 9035                   tyranny           power
## 9036                 undaunted           power
## 9037                     under           power
## 9038                undisputed           power
## 9039                     union           power
## 9040              unrestricted           power
## 9041                unwavering           power
## 9042                 unwilling           power
## 9043             unwillingness           power
## 9044                      urge           power
## 9045                     usurp           power
## 9046                  vanquish           power
## 9047                      veto           power
## 9048                      vice           power
## 9049                    victor           power
## 9050                victorious           power
## 9051                   victory           power
## 9052                       way           power
## 9053                       win           power
## 9054                    winner           power
## 9055                 withstand           power
## 9056                      word           power
## 9057              world-famous           power
## 9058                      able          strong
## 9059                   abolish          strong
## 9060                abominable          strong
## 9061                  abrasive          strong
## 9062                  absolute          strong
## 9063                 abundance          strong
## 9064                  abundant          strong
## 9065                     abuse          strong
## 9066                accelerate          strong
## 9067              acceleration          strong
## 9068                 accession          strong
## 9069                accomplish          strong
## 9070            accomplishment          strong
## 9071                   achieve          strong
## 9072                   acquire          strong
## 9073               acquisition          strong
## 9074                       act          strong
## 9075                    action          strong
## 9076                    active          strong
## 9077                   adamant          strong
## 9078                     adapt          strong
## 9079              adaptability          strong
## 9080                 adaptable          strong
## 9081                adaptation          strong
## 9082                  adaptive          strong
## 9083                       add          strong
## 9084                  addition          strong
## 9085                additional          strong
## 9086                     adept          strong
## 9087                 adeptness          strong
## 9088                    adjust          strong
## 9089                administer          strong
## 9090            administration          strong
## 9091            administrative          strong
## 9092             administrator          strong
## 9093                admiration          strong
## 9094                   admirer          strong
## 9095                  admonish          strong
## 9096                     adorn          strong
## 9097                    adroit          strong
## 9098                  adroitly          strong
## 9099                 adulation          strong
## 9100                     adult          strong
## 9101                   advance          strong
## 9102                 advantage          strong
## 9103              advantageous          strong
## 9104             adventuresome          strong
## 9105               adventurous          strong
## 9106                  advocate          strong
## 9107                  affinity          strong
## 9108                    affirm          strong
## 9109                   afflict          strong
## 9110                    afford          strong
## 9111                    afloat          strong
## 9112                 aggravate          strong
## 9113               aggravation          strong
## 9114                aggression          strong
## 9115                aggressive          strong
## 9116            aggressiveness          strong
## 9117                     agile          strong
## 9118                   agility          strong
## 9119                   agitate          strong
## 9120                 agitation          strong
## 9121                 agreement          strong
## 9122                       aid          strong
## 9123                       air          strong
## 9124                     alert          strong
## 9125                     alive          strong
## 9126                  alliance          strong
## 9127                    allied          strong
## 9128                      ally          strong
## 9129                  almighty          strong
## 9130                     alter          strong
## 9131                 amazement          strong
## 9132                   amazing          strong
## 9133                  ambition          strong
## 9134                 ambitious          strong
## 9135                    ambush          strong
## 9136                     ample          strong
## 9137                   amplify          strong
## 9138                     amply          strong
## 9139                    anchor          strong
## 9140                antagonism          strong
## 9141              antagonistic          strong
## 9142                antagonize          strong
## 9143               appreciable          strong
## 9144              apprehension          strong
## 9145               appropriate          strong
## 9146                   approve          strong
## 9147                       apt          strong
## 9148                  aptitude          strong
## 9149                    ardent          strong
## 9150                     arise          strong
## 9151                       arm          strong
## 9152                     armed          strong
## 9153                      army          strong
## 9154                     arose          strong
## 9155                    arrest          strong
## 9156                  arrogant          strong
## 9157                articulate          strong
## 9158                    ascend          strong
## 9159                    ascent          strong
## 9160                    assail          strong
## 9161                   assault          strong
## 9162                    assert          strong
## 9163                 assertion          strong
## 9164                     asset          strong
## 9165                    assist          strong
## 9166                assistance          strong
## 9167               association          strong
## 9168                 assurance          strong
## 9169                    assure          strong
## 9170                 assuredly          strong
## 9171                   astound          strong
## 9172                  athletic          strong
## 9173                    atomic          strong
## 9174                    attack          strong
## 9175                    attain          strong
## 9176                attainment          strong
## 9177                   attract          strong
## 9178                attraction          strong
## 9179                 audacious          strong
## 9180                  audacity          strong
## 9181                   audible          strong
## 9182                   austere          strong
## 9183             authoritarian          strong
## 9184             authoritative          strong
## 9185                 authority          strong
## 9186                 authorize          strong
## 9187                  autocrat          strong
## 9188                autocratic          strong
## 9189                autonomous          strong
## 9190                     avail          strong
## 9191                    avenge          strong
## 9192                     award          strong
## 9193                     aware          strong
## 9194                 awareness          strong
## 9195                     awful          strong
## 9196                       axe          strong
## 9197                      back          strong
## 9198                  backbone          strong
## 9199                    backer          strong
## 9200                   balance          strong
## 9201                      ball          strong
## 9202                      band          strong
## 9203                    banish          strong
## 9204                       bar          strong
## 9205                      base          strong
## 9206                    battle          strong
## 9207                      bear          strong
## 9208                      beat          strong
## 9209                  beautify          strong
## 9210                      belt          strong
## 9211                   benefit          strong
## 9212                    bestow          strong
## 9213                    beware          strong
## 9214                       big          strong
## 9215                     blast          strong
## 9216                   blatant          strong
## 9217                     blind          strong
## 9218                      bloc          strong
## 9219                     block          strong
## 9220                  blockade          strong
## 9221              bloodthirsty          strong
## 9222                      blow          strong
## 9223                     blunt          strong
## 9224                      body          strong
## 9225                boisterous          strong
## 9226                      bold          strong
## 9227                  boldness          strong
## 9228                   bolster          strong
## 9229                      bomb          strong
## 9230                      bond          strong
## 9231                      boom          strong
## 9232                     boost          strong
## 9233                      bore          strong
## 9234                      boss          strong
## 9235                     bound          strong
## 9236                 boundless          strong
## 9237                 bountiful          strong
## 9238                       box          strong
## 9239                     boxer          strong
## 9240                     brace          strong
## 9241                  brandish          strong
## 9242                   bravado          strong
## 9243                     brave          strong
## 9244                   bravery          strong
## 9245                    brazen          strong
## 9246                    breach          strong
## 9247                     break          strong
## 9248                    bridge          strong
## 9249                     broad          strong
## 9250                   broaden          strong
## 9251                 broadness          strong
## 9252                     broke          strong
## 9253               brotherhood          strong
## 9254                 brutality          strong
## 9255                     build          strong
## 9256                      bulk          strong
## 9257                    bullet          strong
## 9258                   buoyant          strong
## 9259                     burst          strong
## 9260                      busy          strong
## 9261                  butchery          strong
## 9262                       can          strong
## 9263                    candid          strong
## 9264                    candor          strong
## 9265                    cannon          strong
## 9266                capability          strong
## 9267                   capable          strong
## 9268                  capacity          strong
## 9269                   capital          strong
## 9270                capitalize          strong
## 9271                   captain          strong
## 9272                   capture          strong
## 9273                     carry          strong
## 9274                      cast          strong
## 9275                     catch          strong
## 9276                    caught          strong
## 9277                    causal          strong
## 9278                     cause          strong
## 9279                   cavalry          strong
## 9280                    cement          strong
## 9281                    center          strong
## 9282                   central          strong
## 9283                   certain          strong
## 9284                 certainty          strong
## 9285                  chairman          strong
## 9286                  chairmen          strong
## 9287                 challenge          strong
## 9288                     champ          strong
## 9289                  champion          strong
## 9290              championship          strong
## 9291                chancellor          strong
## 9292                    charge          strong
## 9293                  charisma          strong
## 9294                     chief          strong
## 9295                    circle          strong
## 9296                    clever          strong
## 9297                    climax          strong
## 9298                     climb          strong
## 9299                     clout          strong
## 9300                      club          strong
## 9301                   cluster          strong
## 9302                 coalition          strong
## 9303                 cockiness          strong
## 9304                     cocky          strong
## 9305                    cogent          strong
## 9306                  coherent          strong
## 9307                  cohesion          strong
## 9308             collaboration          strong
## 9309                    collar          strong
## 9310                   collect          strong
## 9311                collective          strong
## 9312                   colonel          strong
## 9313                    combat          strong
## 9314                   combine          strong
## 9315                combustion          strong
## 9316                  comeback          strong
## 9317                   comfort          strong
## 9318               comfortable          strong
## 9319                   command          strong
## 9320                 commander          strong
## 9321                commission          strong
## 9322              commissioner          strong
## 9323                 committee          strong
## 9324                 community          strong
## 9325                   company          strong
## 9326                    compel          strong
## 9327                compensate          strong
## 9328                   compete          strong
## 9329                competence          strong
## 9330                competency          strong
## 9331                 competent          strong
## 9332                  complete          strong
## 9333                 composure          strong
## 9334                  compound          strong
## 9335                  compress          strong
## 9336               compression          strong
## 9337                compulsion          strong
## 9338               concentrate          strong
## 9339             concentration          strong
## 9340                  concrete          strong
## 9341                   condemn          strong
## 9342                confidence          strong
## 9343                 confident          strong
## 9344                   confine          strong
## 9345                   confirm          strong
## 9346              confirmation          strong
## 9347                  confront          strong
## 9348             confrontation          strong
## 9349              congregation          strong
## 9350                  congress          strong
## 9351             congressional          strong
## 9352               congressman          strong
## 9353               congressmen          strong
## 9354                   conjure          strong
## 9355                   conquer          strong
## 9356                 conqueror          strong
## 9357                   consent          strong
## 9358              considerable          strong
## 9359               consistency          strong
## 9360                consistent          strong
## 9361               consolidate          strong
## 9362                 constable          strong
## 9363                  constant          strong
## 9364                constitute          strong
## 9365              constitution          strong
## 9366            constitutional          strong
## 9367                 constrain          strong
## 9368                constraint          strong
## 9369                 construct          strong
## 9370              construction          strong
## 9371              constructive          strong
## 9372               consumptive          strong
## 9373                   contain          strong
## 9374                   contend          strong
## 9375                contention          strong
## 9376                   contest          strong
## 9377                 continual          strong
## 9378                  continue          strong
## 9379                continuity          strong
## 9380                continuous          strong
## 9381                  contract          strong
## 9382                contribute          strong
## 9383              contribution          strong
## 9384                   control          strong
## 9385                controller          strong
## 9386                   convert          strong
## 9387                   convict          strong
## 9388                conviction          strong
## 9389                  convince          strong
## 9390                 cooperate          strong
## 9391               cooperation          strong
## 9392               cooperative          strong
## 9393                coordinate          strong
## 9394              coordination          strong
## 9395                       cop          strong
## 9396                      core          strong
## 9397                  corporal          strong
## 9398                 corporate          strong
## 9399               corporation          strong
## 9400                   correct          strong
## 9401                   council          strong
## 9402                counteract          strong
## 9403             counteraction          strong
## 9404                 countless          strong
## 9405                   courage          strong
## 9406                courageous          strong
## 9407                     court          strong
## 9408                     cream          strong
## 9409                    create          strong
## 9410                  creation          strong
## 9411                   creator          strong
## 9412                     crowd          strong
## 9413                     crush          strong
## 9414                  crushing          strong
## 9415                cumbersome          strong
## 9416                cumulative          strong
## 9417                      curb          strong
## 9418                       cut          strong
## 9419                    damage          strong
## 9420                    daring          strong
## 9421                 dauntless          strong
## 9422                    dazzle          strong
## 9423                    deadly          strong
## 9424                      dean          strong
## 9425                    decide          strong
## 9426                  decision          strong
## 9427                  decisive          strong
## 9428               declaration          strong
## 9429                   declare          strong
## 9430                  dedicate          strong
## 9431                dedication          strong
## 9432                      deep          strong
## 9433                    deepen          strong
## 9434                    defeat          strong
## 9435                    defend          strong
## 9436                  defender          strong
## 9437                   defense          strong
## 9438                  defiance          strong
## 9439                   defiant          strong
## 9440                  definite          strong
## 9441                definitive          strong
## 9442                      defy          strong
## 9443                deliberate          strong
## 9444                   deliver          strong
## 9445                  delivery          strong
## 9446                    deluge          strong
## 9447                    demand          strong
## 9448                  demolish          strong
## 9449               demonstrate          strong
## 9450             demonstration          strong
## 9451                demoralize          strong
## 9452                     dense          strong
## 9453                   density          strong
## 9454             dependability          strong
## 9455                dependable          strong
## 9456                    deploy          strong
## 9457                   deprive          strong
## 9458                     depth          strong
## 9459                deservedly          strong
## 9460                 designate          strong
## 9461                   despise          strong
## 9462                   destiny          strong
## 9463                   destroy          strong
## 9464               destructive          strong
## 9465                     deter          strong
## 9466             determination          strong
## 9467                 determine          strong
## 9468                 deterrent          strong
## 9469               detrimental          strong
## 9470                 devastate          strong
## 9471                   develop          strong
## 9472               development          strong
## 9473                    devout          strong
## 9474                 dexterity          strong
## 9475                  dictator          strong
## 9476              dictatorship          strong
## 9477                 dignified          strong
## 9478                   dignity          strong
## 9479                  diligent          strong
## 9480                       din          strong
## 9481                    direct          strong
## 9482                  director          strong
## 9483                 discharge          strong
## 9484                discipline          strong
## 9485              displacement          strong
## 9486                   dispose          strong
## 9487                  dissolve          strong
## 9488             distinguished          strong
## 9489                    divide          strong
## 9490                    divine          strong
## 9491                  divinity          strong
## 9492                        do          strong
## 9493                  dominant          strong
## 9494                  dominate          strong
## 9495                domination          strong
## 9496                      done          strong
## 9497                    double          strong
## 9498                 doubtless          strong
## 9499                      draw          strong
## 9500                     drive          strong
## 9501                durability          strong
## 9502                   durable          strong
## 9503                      duty          strong
## 9504                   dynamic          strong
## 9505                     eager          strong
## 9506                      earn          strong
## 9507                    earner          strong
## 9508                   earnest          strong
## 9509                    editor          strong
## 9510                   educate          strong
## 9511                    effect          strong
## 9512                 effective          strong
## 9513             effectiveness          strong
## 9514                  efficacy          strong
## 9515                efficiency          strong
## 9516                 efficient          strong
## 9517                     elder          strong
## 9518                   elevate          strong
## 9519                 eliminate          strong
## 9520               elimination          strong
## 9521              emancipation          strong
## 9522                  eminence          strong
## 9523                   eminent          strong
## 9524                   emperor          strong
## 9525                  emphasis          strong
## 9526                 emphasize          strong
## 9527                  emphatic          strong
## 9528                    employ          strong
## 9529                  employer          strong
## 9530                   empower          strong
## 9531               empowerment          strong
## 9532                    enable          strong
## 9533                     enact          strong
## 9534                 enactment          strong
## 9535                   enclose          strong
## 9536                 encompass          strong
## 9537                   endless          strong
## 9538                   endorse          strong
## 9539                 endurance          strong
## 9540                    endure          strong
## 9541                 energetic          strong
## 9542                  energize          strong
## 9543                    energy          strong
## 9544                   enforce          strong
## 9545               enforcement          strong
## 9546                    engulf          strong
## 9547                   enhance          strong
## 9548                  enormous          strong
## 9549                    enrich          strong
## 9550                enrichment          strong
## 9551                    ensure          strong
## 9552                enterprise          strong
## 9553              enthusiastic          strong
## 9554                    entire          strong
## 9555                   entitle          strong
## 9556                     equal          strong
## 9557               equilibrium          strong
## 9558                     equip          strong
## 9559                     erect          strong
## 9560                    escape          strong
## 9561                   essence          strong
## 9562                 essential          strong
## 9563                 establish          strong
## 9564                   eternal          strong
## 9565                      ever          strong
## 9566               everlasting          strong
## 9567                     every          strong
## 9568                  evidence          strong
## 9569                     exact          strong
## 9570                    exceed          strong
## 9571                     excel          strong
## 9572                   exclude          strong
## 9573                 exclusion          strong
## 9574                 exclusive          strong
## 9575                    excuse          strong
## 9576                 execution          strong
## 9577                 executive          strong
## 9578                  exercise          strong
## 9579                     exert          strong
## 9580                    expand          strong
## 9581                   expanse          strong
## 9582                 expansion          strong
## 9583                experience          strong
## 9584                    expert          strong
## 9585                   exploit          strong
## 9586                 explosion          strong
## 9587                 explosive          strong
## 9588                    extend          strong
## 9589                 extension          strong
## 9590                 extensive          strong
## 9591                extinguish          strong
## 9592                   extreme          strong
## 9593                      face          strong
## 9594                facilitate          strong
## 9595                  facility          strong
## 9596                   faculty          strong
## 9597                      fast          strong
## 9598                      fate          strong
## 9599                    father          strong
## 9600                    fathom          strong
## 9601                      fear          strong
## 9602                  fearless          strong
## 9603                  feasible          strong
## 9604                federation          strong
## 9605                      feed          strong
## 9606                fellowship          strong
## 9607                     fence          strong
## 9608                   fervent          strong
## 9609                    fervor          strong
## 9610                       few          strong
## 9611                     fiery          strong
## 9612                     fight          strong
## 9613                   fighter          strong
## 9614                      fill          strong
## 9615                     final          strong
## 9616                   finance          strong
## 9617                      fine          strong
## 9618                      fire          strong
## 9619                      firm          strong
## 9620                  firmness          strong
## 9621                      fist          strong
## 9622                   fitness          strong
## 9623                       fix          strong
## 9624                     flair          strong
## 9625                     fleet          strong
## 9626                      flew          strong
## 9627                     flood          strong
## 9628                     floor          strong
## 9629                  flourish          strong
## 9630                       fly          strong
## 9631                     focal          strong
## 9632                    forbid          strong
## 9633                     force          strong
## 9634                  foremost          strong
## 9635                 foresight          strong
## 9636                   forever          strong
## 9637                 formation          strong
## 9638                formidable          strong
## 9639                      fort          strong
## 9640                   fortify          strong
## 9641                 fortitude          strong
## 9642                   fortune          strong
## 9643                    fought          strong
## 9644                     found          strong
## 9645                foundation          strong
## 9646                   founder          strong
## 9647                     frame          strong
## 9648                      free          strong
## 9649                  fruitful          strong
## 9650                 frustrate          strong
## 9651                      fuck          strong
## 9652                   fulfill          strong
## 9653               fulfillment          strong
## 9654                      full          strong
## 9655                  function          strong
## 9656               fundamental          strong
## 9657                   further          strong
## 9658                      gain          strong
## 9659                      gall          strong
## 9660                   gallant          strong
## 9661                      game          strong
## 9662                      gang          strong
## 9663                   general          strong
## 9664                    genius          strong
## 9665                       get          strong
## 9666                     giant          strong
## 9667                    gifted          strong
## 9668                  gigantic          strong
## 9669                     glare          strong
## 9670                   glimmer          strong
## 9671                     gloat          strong
## 9672                   glorify          strong
## 9673                        go          strong
## 9674                       god          strong
## 9675                   goddess          strong
## 9676                   godlike          strong
## 9677                 godliness          strong
## 9678                      gone          strong
## 9679                    govern          strong
## 9680                government          strong
## 9681              governmental          strong
## 9682                  governor          strong
## 9683                     grand          strong
## 9684                  grandeur          strong
## 9685                     grant          strong
## 9686                   grapple          strong
## 9687                     grasp          strong
## 9688             gravitational          strong
## 9689                   gravity          strong
## 9690                     great          strong
## 9691                 greatness          strong
## 9692                     grind          strong
## 9693                      grip          strong
## 9694                    ground          strong
## 9695                      grow          strong
## 9696                    grower          strong
## 9697                     grown          strong
## 9698                    growth          strong
## 9699                     gruff          strong
## 9700                 guarantee          strong
## 9701                     guard          strong
## 9702                  guardian          strong
## 9703                 guerrilla          strong
## 9704                  guidance          strong
## 9705                     guide          strong
## 9706                     guild          strong
## 9707                       gun          strong
## 9708                    gunmen          strong
## 9709                     gusto          strong
## 9710                      halt          strong
## 9711                    hamper          strong
## 9712                      hand          strong
## 9713                    handle          strong
## 9714                    harbor          strong
## 9715                      hard          strong
## 9716                     hardy          strong
## 9717                      harm          strong
## 9718                   harmful          strong
## 9719                     harsh          strong
## 9720                   haughty          strong
## 9721                      head          strong
## 9722              headquarters          strong
## 9723                      heal          strong
## 9724                    health          strong
## 9725                   healthy          strong
## 9726                     heart          strong
## 9727                  heartily          strong
## 9728                      heat          strong
## 9729                     heavy          strong
## 9730                  heighten          strong
## 9731                      herd          strong
## 9732                      hero          strong
## 9733                    heroic          strong
## 9734                   heroism          strong
## 9735                      high          strong
## 9736                    hinder          strong
## 9737                      hire          strong
## 9738                       hit          strong
## 9739                      hold          strong
## 9740                    holder          strong
## 9741                      huge          strong
## 9742                      hurt          strong
## 9743                   immense          strong
## 9744                 immovable          strong
## 9745                    impact          strong
## 9746                    impair          strong
## 9747                    impede          strong
## 9748                     impel          strong
## 9749                  imperial          strong
## 9750               imperialist          strong
## 9751                impervious          strong
## 9752                   impetus          strong
## 9753                 implement          strong
## 9754            implementation          strong
## 9755                    impose          strong
## 9756                   impress          strong
## 9757                impressive          strong
## 9758                   improve          strong
## 9759               improvement          strong
## 9760                 incessant          strong
## 9761                   include          strong
## 9762                  increase          strong
## 9763              independence          strong
## 9764               independent          strong
## 9765          indispensability          strong
## 9766             indispensable          strong
## 9767              indisputable          strong
## 9768               indomitable          strong
## 9769                    induce          strong
## 9770                industrial          strong
## 9771             industrialize          strong
## 9772               industrious          strong
## 9773                  industry          strong
## 9774             inevitability          strong
## 9775                inevitable          strong
## 9776             infallibility          strong
## 9777                infallible          strong
## 9778                  infantry          strong
## 9779              infiltration          strong
## 9780                  infinite          strong
## 9781                 influence          strong
## 9782               influential          strong
## 9783              infringement          strong
## 9784                  inherent          strong
## 9785                   inhibit          strong
## 9786                inhibition          strong
## 9787                  initiate          strong
## 9788                initiative          strong
## 9789                injunction          strong
## 9790                     inner          strong
## 9791               innumerable          strong
## 9792                    insist          strong
## 9793                insistence          strong
## 9794                 insistent          strong
## 9795                   inspire          strong
## 9796               institution          strong
## 9797             institutional          strong
## 9798                  instruct          strong
## 9799               instruction          strong
## 9800                instructor          strong
## 9801              instrumental          strong
## 9802                    intact          strong
## 9803               integration          strong
## 9804                 integrity          strong
## 9805                 intellect          strong
## 9806              intellectual          strong
## 9807              intelligence          strong
## 9808               intelligent          strong
## 9809                   intense          strong
## 9810                 intensify          strong
## 9811                 intensity          strong
## 9812                 intensive          strong
## 9813                 interfere          strong
## 9814              interference          strong
## 9815                  internal          strong
## 9816              intervention          strong
## 9817                intimidate          strong
## 9818                  inundate          strong
## 9819                invariable          strong
## 9820                invariably          strong
## 9821                 inventory          strong
## 9822                invincible          strong
## 9823                    invite          strong
## 9824                   involve          strong
## 9825              invulnerable          strong
## 9826                      iron          strong
## 9827               irrefutable          strong
## 9828                   isolate          strong
## 9829                     issue          strong
## 9830                      jail          strong
## 9831                       jar          strong
## 9832                      jerk          strong
## 9833                      join          strong
## 9834                   jointly          strong
## 9835                     judge          strong
## 9836                  judgment          strong
## 9837                  judicial          strong
## 9838              jurisdiction          strong
## 9839                     juror          strong
## 9840                      jury          strong
## 9841                      keen          strong
## 9842                      keep          strong
## 9843                    keeper          strong
## 9844                      kick          strong
## 9845                      kill          strong
## 9846                    killer          strong
## 9847                      king          strong
## 9848                     knife          strong
## 9849                     knock          strong
## 9850                 knowledge          strong
## 9851                     labor          strong
## 9852                  landlord          strong
## 9853                     large          strong
## 9854                      last          strong
## 9855                    launch          strong
## 9856                       lay          strong
## 9857                      lead          strong
## 9858                    leader          strong
## 9859                leadership          strong
## 9860                    league          strong
## 9861                    legion          strong
## 9862               legislation          strong
## 9863               legislative          strong
## 9864                legislator          strong
## 9865                    length          strong
## 9866                       let          strong
## 9867                     level          strong
## 9868                liberation          strong
## 9869                lieutenant          strong
## 9870                      lift          strong
## 9871                 lightning          strong
## 9872                     limit          strong
## 9873                 limitless          strong
## 9874                      lion          strong
## 9875                   lioness          strong
## 9876                 liquidate          strong
## 9877               liquidation          strong
## 9878                      live          strong
## 9879                    lively          strong
## 9880                      load          strong
## 9881                      lock          strong
## 9882                      long          strong
## 9883                 longevity          strong
## 9884                      look          strong
## 9885                       lot          strong
## 9886                      loud          strong
## 9887                      love          strong
## 9888                     lower          strong
## 9889                      luck          strong
## 9890               magnificent          strong
## 9891                   magnify          strong
## 9892                 magnitude          strong
## 9893                      main          strong
## 9894                  maintain          strong
## 9895                     major          strong
## 9896                  majority          strong
## 9897                      make          strong
## 9898                    manage          strong
## 9899                manageable          strong
## 9900                management          strong
## 9901                   manager          strong
## 9902                managerial          strong
## 9903                  maneuver          strong
## 9904                manipulate          strong
## 9905                     manly          strong
## 9906                  manpower          strong
## 9907               manufacture          strong
## 9908              manufacturer          strong
## 9909                      many          strong
## 9910                       mar          strong
## 9911                     march          strong
## 9912                   marcher          strong
## 9913                      mark          strong
## 9914                 masculine          strong
## 9915                      mass          strong
## 9916                   massive          strong
## 9917                    master          strong
## 9918                 masterful          strong
## 9919                   mastery          strong
## 9920                     match          strong
## 9921                  material          strong
## 9922                    matter          strong
## 9923                    mature          strong
## 9924                  maturity          strong
## 9925              maximization          strong
## 9926                   maximum          strong
## 9927                     mayor          strong
## 9928                   measure          strong
## 9929                    menace          strong
## 9930                 merciless          strong
## 9931                     merit          strong
## 9932                methodical          strong
## 9933                     might          strong
## 9934                    mighty          strong
## 9935                  military          strong
## 9936                   militia          strong
## 9937                      mine          strong
## 9938                  minimize          strong
## 9939                  minister          strong
## 9940                  ministry          strong
## 9941                   missile          strong
## 9942                    mobile          strong
## 9943                    modify          strong
## 9944                      mold          strong
## 9945                  momentum          strong
## 9946                   monitor          strong
## 9947                  monopoly          strong
## 9948                   monster          strong
## 9949                 monstrous          strong
## 9950                  monument          strong
## 9951                      more          strong
## 9952                      most          strong
## 9953                      move          strong
## 9954                  movement          strong
## 9955                     mover          strong
## 9956                      much          strong
## 9957                    muffle          strong
## 9958                  multiple          strong
## 9959            multiplication          strong
## 9960                  multiply          strong
## 9961                    murder          strong
## 9962                    muscle          strong
## 9963                  muscular          strong
## 9964                    muster          strong
## 9965                     naval          strong
## 9966                      navy          strong
## 9967                      near          strong
## 9968                 necessary          strong
## 9969               necessitate          strong
## 9970                 necessity          strong
## 9971                     nerve          strong
## 9972                   network          strong
## 9973                neutralize          strong
## 9974                       new          strong
## 9975                    nimble          strong
## 9976                     noble          strong
## 9977                nonchalant          strong
## 9978                      norm          strong
## 9979                   notable          strong
## 9980                   nuclear          strong
## 9981                    nuclei          strong
## 9982                   nucleus          strong
## 9983                    number          strong
## 9984                  numerous          strong
## 9985                 objective          strong
## 9986                  obstacle          strong
## 9987                  obstruct          strong
## 9988                    obtain          strong
## 9989                  occasion          strong
## 9990                    occupy          strong
## 9991                 offensive          strong
## 9992                     offer          strong
## 9993                   officer          strong
## 9994                  official          strong
## 9995                 officiate          strong
## 9996                     often          strong
## 9997                   ominous          strong
## 9998                      once          strong
## 9999                   operate          strong
## 10000                operation          strong
## 10001              operational          strong
## 10002                operative          strong
## 10003                   oppose          strong
## 10004                    order          strong
## 10005                ordinance          strong
## 10006             organization          strong
## 10007                 organize          strong
## 10008                originate          strong
## 10009                     oust          strong
## 10010                   outfit          strong
## 10011                  outlive          strong
## 10012                   output          strong
## 10013                 outreach          strong
## 10014                   outrun          strong
## 10015              outstanding          strong
## 10016                     over          strong
## 10017                 overcame          strong
## 10018                 overcome          strong
## 10019                 overhaul          strong
## 10020                overlying          strong
## 10021                overpower          strong
## 10022                  overrun          strong
## 10023                 overseer          strong
## 10024                overthrow          strong
## 10025                overwhelm          strong
## 10026                      own          strong
## 10027                    owner          strong
## 10028                ownership          strong
## 10029              painstaking          strong
## 10030              pandemonium          strong
## 10031                   pardon          strong
## 10032               parliament          strong
## 10033                     part          strong
## 10034                  partner          strong
## 10035              partnership          strong
## 10036                    party          strong
## 10037                     pass          strong
## 10038                  passion          strong
## 10039               passionate          strong
## 10040                 patience          strong
## 10041                  patient          strong
## 10042                   patrol          strong
## 10043                   patron          strong
## 10044                patronage          strong
## 10045                     peak          strong
## 10046                penetrate          strong
## 10047              penetration          strong
## 10048                  perfect          strong
## 10049                permanent          strong
## 10050               permission          strong
## 10051                   permit          strong
## 10052                perpetual          strong
## 10053               perpetuate          strong
## 10054             perseverance          strong
## 10055                persevere          strong
## 10056                  persist          strong
## 10057              persistence          strong
## 10058               persistent          strong
## 10059                 persuade          strong
## 10060                 physical          strong
## 10061                     pick          strong
## 10062                   piston          strong
## 10063                 pitiless          strong
## 10064                   plague          strong
## 10065                     plan          strong
## 10066                    plant          strong
## 10067                   please          strong
## 10068                  pleased          strong
## 10069                plentiful          strong
## 10070                   plenty          strong
## 10071                     plot          strong
## 10072                 poignant          strong
## 10073                    point          strong
## 10074                    poise          strong
## 10075                   police          strong
## 10076                policeman          strong
## 10077                policemen          strong
## 10078                   policy          strong
## 10079               politician          strong
## 10080                  popular          strong
## 10081                    posse          strong
## 10082                  possess          strong
## 10083                 possible          strong
## 10084                  potency          strong
## 10085                   potent          strong
## 10086                potential          strong
## 10087             potentiality          strong
## 10088                    pound          strong
## 10089                    power          strong
## 10090                 powerful          strong
## 10091               precaution          strong
## 10092                 precious          strong
## 10093              predominant          strong
## 10094              predominate          strong
## 10095               preeminent          strong
## 10096                  prepare          strong
## 10097                 preserve          strong
## 10098                  preside          strong
## 10099               presidency          strong
## 10100                president          strong
## 10101             presidential          strong
## 10102                    press          strong
## 10103                 pressure          strong
## 10104                 prestige          strong
## 10105                  prevail          strong
## 10106                prevalent          strong
## 10107                  prevent          strong
## 10108               prevention          strong
## 10109               preventive          strong
## 10110                    pride          strong
## 10111                  primary          strong
## 10112                   prince          strong
## 10113                principal          strong
## 10114                 priority          strong
## 10115                privilege          strong
## 10116               privileged          strong
## 10117                    prize          strong
## 10118                proactive          strong
## 10119                    probe          strong
## 10120                 proclaim          strong
## 10121             proclamation          strong
## 10122                  proctor          strong
## 10123                  procure          strong
## 10124              procurement          strong
## 10125                     prod          strong
## 10126                  produce          strong
## 10127               productive          strong
## 10128               proficient          strong
## 10129                   profit          strong
## 10130               profitable          strong
## 10131                 profound          strong
## 10132                 progress          strong
## 10133                 prohibit          strong
## 10134              prohibition          strong
## 10135              prohibitive          strong
## 10136                  project          strong
## 10137                  prolong          strong
## 10138               prominence          strong
## 10139                prominent          strong
## 10140                  promote          strong
## 10141                promotion          strong
## 10142                   prompt          strong
## 10143                    proof          strong
## 10144                proponent          strong
## 10145               proprietor          strong
## 10146              prosecution          strong
## 10147                  protect          strong
## 10148               protection          strong
## 10149               protective          strong
## 10150                protector          strong
## 10151                    proud          strong
## 10152                    prove          strong
## 10153                  provide          strong
## 10154               providence          strong
## 10155                  provoke          strong
## 10156                  prowess          strong
## 10157                     pull          strong
## 10158                   punish          strong
## 10159                  purpose          strong
## 10160               purposeful          strong
## 10161                   pursue          strong
## 10162                     push          strong
## 10163                      put          strong
## 10164                  qualify          strong
## 10165                    quest          strong
## 10166                    quiet          strong
## 10167                 radiance          strong
## 10168                  radical          strong
## 10169                     rage          strong
## 10170                     raid          strong
## 10171                    raise          strong
## 10172                  rampant          strong
## 10173                   rattle          strong
## 10174                     rave          strong
## 10175                      raw          strong
## 10176                    reach          strong
## 10177                readiness          strong
## 10178                    ready          strong
## 10179                 reaffirm          strong
## 10180                  realize          strong
## 10181                   reason          strong
## 10182              reassurance          strong
## 10183                 reassure          strong
## 10184                    rebel          strong
## 10185                rebellion          strong
## 10186                  rebuild          strong
## 10187                recommend          strong
## 10188           recommendation          strong
## 10189              reconstruct          strong
## 10190           reconstruction          strong
## 10191                  recover          strong
## 10192                 recovery          strong
## 10193                  recruit          strong
## 10194              recruitment          strong
## 10195                recurrent          strong
## 10196                   redeem          strong
## 10197                   reduce          strong
## 10198              reestablish          strong
## 10199                   regain          strong
## 10200                   regime          strong
## 10201                 regiment          strong
## 10202                  regular          strong
## 10203                 regulate          strong
## 10204               regulation          strong
## 10205                reinforce          strong
## 10206                reiterate          strong
## 10207                   reject          strong
## 10208                rejection          strong
## 10209               relentless          strong
## 10210              reliability          strong
## 10211                 reliable          strong
## 10212                  relieve          strong
## 10213               remarkable          strong
## 10214               remarkably          strong
## 10215                  removal          strong
## 10216                   remove          strong
## 10217                   render          strong
## 10218                    renew          strong
## 10219                   repair          strong
## 10220                    repel          strong
## 10221                replenish          strong
## 10222                repudiate          strong
## 10223                  repulse          strong
## 10224                  require          strong
## 10225              requirement          strong
## 10226                  reserve          strong
## 10227                   resist          strong
## 10228               resistance          strong
## 10229                 resolute          strong
## 10230               resolution          strong
## 10231                  resolve          strong
## 10232                 resolved          strong
## 10233                  resound          strong
## 10234                 resource          strong
## 10235              resourceful          strong
## 10236          resourcefulness          strong
## 10237                  restore          strong
## 10238                 restrain          strong
## 10239                restraint          strong
## 10240                 restrict          strong
## 10241               resumption          strong
## 10242                   retain          strong
## 10243                retention          strong
## 10244                  revenue          strong
## 10245                   revive          strong
## 10246            revolutionary          strong
## 10247                   reward          strong
## 10248                     rich          strong
## 10249                    right          strong
## 10250                      rip          strong
## 10251                     rise          strong
## 10252                    rival          strong
## 10253                     roar          strong
## 10254                   robust          strong
## 10255                     root          strong
## 10256                     rose          strong
## 10257                roughness          strong
## 10258                    royal          strong
## 10259                  royalty          strong
## 10260                   rugged          strong
## 10261                     ruin          strong
## 10262                     rule          strong
## 10263                      run          strong
## 10264                 sagacity          strong
## 10265                     sage          strong
## 10266                 sanction          strong
## 10267                  satisfy          strong
## 10268                     save          strong
## 10269                    savvy          strong
## 10270                      say          strong
## 10271                    scare          strong
## 10272                   scared          strong
## 10273                  scatter          strong
## 10274                   search          strong
## 10275                   second          strong
## 10276                   secure          strong
## 10277                    seize          strong
## 10278           self-contained          strong
## 10279                   senate          strong
## 10280                  senator          strong
## 10281                   senior          strong
## 10282              sensational          strong
## 10283                 sentence          strong
## 10284                   serene          strong
## 10285                      set          strong
## 10286                   settle          strong
## 10287                   severe          strong
## 10288                 severity          strong
## 10289                    shape          strong
## 10290                    sharp          strong
## 10291                  shatter          strong
## 10292                    shell          strong
## 10293                  shelter          strong
## 10294                  sheriff          strong
## 10295                    shift          strong
## 10296                    shock          strong
## 10297                    shoot          strong
## 10298                     shot          strong
## 10299                 shoulder          strong
## 10300                     show          strong
## 10301                   shrewd          strong
## 10302               shrewdness          strong
## 10303                   shriek          strong
## 10304                     shut          strong
## 10305             significance          strong
## 10306              significant          strong
## 10307                  sizable          strong
## 10308                     slam          strong
## 10309                    slash          strong
## 10310                   slayer          strong
## 10311                    smart          strong
## 10312                    smash          strong
## 10313                   snatch          strong
## 10314                     soar          strong
## 10315                    sober          strong
## 10316                    solid          strong
## 10317               solidarity          strong
## 10318                 solidity          strong
## 10319                    sound          strong
## 10320                soundness          strong
## 10321                   source          strong
## 10322                sovereign          strong
## 10323              sovereignty          strong
## 10324                    spare          strong
## 10325                    spear          strong
## 10326              spectacular          strong
## 10327                    speed          strong
## 10328                    split          strong
## 10329                  sponsor          strong
## 10330              spontaneous          strong
## 10331                sprightly          strong
## 10332                 squarely          strong
## 10333                  squeeze          strong
## 10334                stability          strong
## 10335                stabilize          strong
## 10336                   stable          strong
## 10337                    stamp          strong
## 10338                    stand          strong
## 10339                    state          strong
## 10340                statesman          strong
## 10341                statesmen          strong
## 10342               statuesque          strong
## 10343                  staunch          strong
## 10344              staunchness          strong
## 10345                steadfast          strong
## 10346            steadfastness          strong
## 10347                 steadily          strong
## 10348               steadiness          strong
## 10349                   steady          strong
## 10350                    steel          strong
## 10351                     step          strong
## 10352                    stern          strong
## 10353                    stick          strong
## 10354                    stiff          strong
## 10355                  stiffly          strong
## 10356                   stifle          strong
## 10357                    still          strong
## 10358                 stoicism          strong
## 10359                  stomach          strong
## 10360                    stone          strong
## 10361                    stood          strong
## 10362                     stop          strong
## 10363                    storm          strong
## 10364          straightforward          strong
## 10365                strategic          strong
## 10366                 strength          strong
## 10367               strengthen          strong
## 10368                strenuous          strong
## 10369                   strict          strong
## 10370                   strike          strong
## 10371                stringent          strong
## 10372                    strip          strong
## 10373                   strong          strong
## 10374               stronghold          strong
## 10375                   struck          strong
## 10376                 stubborn          strong
## 10377               stubbornly          strong
## 10378             stubbornness          strong
## 10379                    stuff          strong
## 10380                     stun          strong
## 10381                   sturdy          strong
## 10382                    suave          strong
## 10383                   subdue          strong
## 10384              substantial          strong
## 10385                successor          strong
## 10386                  suffice          strong
## 10387               sufficient          strong
## 10388                   summon          strong
## 10389           superintendent          strong
## 10390                 superior          strong
## 10391              superiority          strong
## 10392               supplement          strong
## 10393                 supplier          strong
## 10394                   supply          strong
## 10395                  support          strong
## 10396                 suppress          strong
## 10397              suppression          strong
## 10398                supremacy          strong
## 10399                  supreme          strong
## 10400                     sure          strong
## 10401                  surplus          strong
## 10402                 surround          strong
## 10403             surveillance          strong
## 10404                 survival          strong
## 10405                  survive          strong
## 10406                  sustain          strong
## 10407                    swift          strong
## 10408                    sword          strong
## 10409               systematic          strong
## 10410           systematically          strong
## 10411                     take          strong
## 10412                   talent          strong
## 10413                 talented          strong
## 10414                     tall          strong
## 10415                     taut          strong
## 10416                tenacious          strong
## 10417                 tenacity          strong
## 10418                     tend          strong
## 10419                terminate          strong
## 10420              territorial          strong
## 10421                    thick          strong
## 10422                  thicken          strong
## 10423                 thorough          strong
## 10424                   threat          strong
## 10425                 threaten          strong
## 10426                   thrill          strong
## 10427                   thrive          strong
## 10428                    throw          strong
## 10429                   thrust          strong
## 10430                  thunder          strong
## 10431                   thwart          strong
## 10432                     till          strong
## 10433                 together          strong
## 10434                    total          strong
## 10435                    tough          strong
## 10436                tradition          strong
## 10437              traditional          strong
## 10438                transform          strong
## 10439           transformation          strong
## 10440                     trap          strong
## 10441               tremendous          strong
## 10442                  triumph          strong
## 10443                triumphal          strong
## 10444               triumphant          strong
## 10445                    troop          strong
## 10446                    trust          strong
## 10447              trustworthy          strong
## 10448                  tyranny          strong
## 10449                 ultimate          strong
## 10450                unanimous          strong
## 10451                unchecked          strong
## 10452              uncontested          strong
## 10453                undaunted          strong
## 10454               undeniable          strong
## 10455                undermine          strong
## 10456                undertake          strong
## 10457               undertaken          strong
## 10458                undertook          strong
## 10459               undisputed          strong
## 10460                undoubted          strong
## 10461              undoubtedly          strong
## 10462              unequivocal          strong
## 10463                unfailing          strong
## 10464              unification          strong
## 10465                    unify          strong
## 10466                    union          strong
## 10467                   unison          strong
## 10468                    unite          strong
## 10469                    unity          strong
## 10470                universal          strong
## 10471                  unleash          strong
## 10472                unlimited          strong
## 10473             unmistakable          strong
## 10474              unmitigated          strong
## 10475           unquestionable          strong
## 10476             unquestioned          strong
## 10477                   untold          strong
## 10478               unwavering          strong
## 10479            unwillingness          strong
## 10480                uppermost          strong
## 10481                  upright          strong
## 10482                    upset          strong
## 10483                     urge          strong
## 10484                   urgent          strong
## 10485                  utility          strong
## 10486                  vantage          strong
## 10487                     vast          strong
## 10488                 vehement          strong
## 10489                vengeance          strong
## 10490                   victor          strong
## 10491               victorious          strong
## 10492                  victory          strong
## 10493                vigilance          strong
## 10494                 vigilant          strong
## 10495                    vigor          strong
## 10496                 vigorous          strong
## 10497                 violence          strong
## 10498                  violent          strong
## 10499                    vital          strong
## 10500                 vitality          strong
## 10501                vivacious          strong
## 10502                    vivid          strong
## 10503                     wage          strong
## 10504                     want          strong
## 10505                  warfare          strong
## 10506                  warrior          strong
## 10507                      way          strong
## 10508                   wealth          strong
## 10509                  wealthy          strong
## 10510                   weight          strong
## 10511                     well          strong
## 10512                    whack          strong
## 10513                     whip          strong
## 10514                    whirl          strong
## 10515                    whole          strong
## 10516                     wide          strong
## 10517                    widen          strong
## 10518               widespread          strong
## 10519                     wild          strong
## 10520                      win          strong
## 10521                   winner          strong
## 10522                 withheld          strong
## 10523                 withhold          strong
## 10524                withstand          strong
## 10525                      won          strong
## 10526             world-famous          strong
## 10527               world-wide          strong
## 10528                    wound          strong
## 10529                     zeal          strong
## 10530                  zealous          strong
## 10531                     zest          strong
## 10532                 abdicate          submit
## 10533                   abject          submit
## 10534                  abscond          submit
## 10535                   accept          submit
## 10536                   adjust          submit
## 10537                   admire          submit
## 10538               admissible          submit
## 10539                admission          submit
## 10540                    admit          submit
## 10541                   afraid          submit
## 10542                  aimless          submit
## 10543                    alibi          submit
## 10544               apologetic          submit
## 10545                apologize          submit
## 10546                  apology          submit
## 10547                   appeal          submit
## 10548                  appease          submit
## 10549                applicant          submit
## 10550              application          submit
## 10551                    apply          submit
## 10552               appreciate          submit
## 10553                      ask          submit
## 10554                assistant          submit
## 10555                   attend          submit
## 10556                attendant          submit
## 10557                attention          submit
## 10558                attentive          submit
## 10559                   attest          submit
## 10560                      awe          submit
## 10561                   bearer          submit
## 10562                     beat          submit
## 10563                      beg          submit
## 10564                  believe          submit
## 10565                 believer          submit
## 10566                   belong          submit
## 10567                     bend          submit
## 10568                  beseech          submit
## 10569                  bondage          submit
## 10570                      bow          submit
## 10571                   buckle          submit
## 10572               capitulate          submit
## 10573                  captive          submit
## 10574                  capture          submit
## 10575                    chain          submit
## 10576                   colony          submit
## 10577                   commit          submit
## 10578                 commoner          submit
## 10579                   comply          submit
## 10580               compromise          submit
## 10581                  concede          submit
## 10582               concession          submit
## 10583                  confess          submit
## 10584               confession          submit
## 10585               confidence          submit
## 10586                  conform          submit
## 10587               conformity          submit
## 10588                  consent          submit
## 10589                  convict          submit
## 10590                   coward          submit
## 10591                credulous          submit
## 10592                   crouch          submit
## 10593                  crumble          submit
## 10594                  crumple          submit
## 10595                    defer          submit
## 10596                   depend          submit
## 10597               dependence          submit
## 10598                dependent          submit
## 10599                  despair          submit
## 10600                destitute          submit
## 10601                   devote          submit
## 10602                 devotion          submit
## 10603                 disciple          submit
## 10604           discouragement          submit
## 10605               dishearten          submit
## 10606                 dishonor          submit
## 10607           dispensability          submit
## 10608                      due          submit
## 10609                     duty          submit
## 10610                 employee          submit
## 10611                   enroll          submit
## 10612                  entreat          submit
## 10613                    exalt          submit
## 10614                   excuse          submit
## 10615                    extol          submit
## 10616                    exult          submit
## 10617               exultation          submit
## 10618                    faith          submit
## 10619                      fan          submit
## 10620                     fear          submit
## 10621                  fearful          submit
## 10622                   fickle          submit
## 10623                 fidelity          submit
## 10624                  flatter          submit
## 10625                 flattery          submit
## 10626                   follow          submit
## 10627                 follower          submit
## 10628                  forsake          submit
## 10629                 futility          submit
## 10630                 gingerly          submit
## 10631                       go          submit
## 10632                     gone          submit
## 10633                 grateful          submit
## 10634                    grind          submit
## 10635                 hallowed          submit
## 10636                  hapless          submit
## 10637                 harmless          submit
## 10638                     heed          submit
## 10639                     help          submit
## 10640                 helpless          submit
## 10641             helplessness          submit
## 10642                   homage          submit
## 10643                    honor          submit
## 10644                   humble          submit
## 10645                imitation          submit
## 10646                  implore          submit
## 10647               impossible          submit
## 10648             imprisonment          submit
## 10649               inadequate          submit
## 10650                incapable          submit
## 10651                 indebted          submit
## 10652              inferiority          submit
## 10653                    kneel          submit
## 10654                    knelt          submit
## 10655                  laborer          submit
## 10656                     lean          submit
## 10657                  learner          submit
## 10658                     look          submit
## 10659                    lowly          submit
## 10660                    loyal          submit
## 10661                  loyalty          submit
## 10662                     maid          submit
## 10663                     meek          submit
## 10664                   menial          submit
## 10665                     mind          submit
## 10666                 minority          submit
## 10667                   modest          submit
## 10668                   murmur          submit
## 10669                     name          submit
## 10670                obedience          submit
## 10671                 obedient          submit
## 10672                     obey          submit
## 10673               obligation          submit
## 10674                   oblige          submit
## 10675               oppression          submit
## 10676               oppressive          submit
## 10677              participant          submit
## 10678                  passive          submit
## 10679                  patient          submit
## 10680                      pay          submit
## 10681                  peasant          submit
## 10682                 petition          submit
## 10683               petitioner          submit
## 10684                     plea          submit
## 10685                    plead          submit
## 10686                   please          submit
## 10687                   porter          submit
## 10688                powerless          submit
## 10689                     pray          submit
## 10690                   prayer          submit
## 10691                 prisoner          submit
## 10692                  private          submit
## 10693                    pupil          submit
## 10694                      put          submit
## 10695               questioner          submit
## 10696                     quit          submit
## 10697                    react          submit
## 10698                 reaction          submit
## 10699                  receive          submit
## 10700                 receiver          submit
## 10701                   recoil          submit
## 10702               recompense          submit
## 10703                  recruit          submit
## 10704               redemption          submit
## 10705                   regard          submit
## 10706           rehabilitation          submit
## 10707                  relapse          submit
## 10708                 reliance          submit
## 10709               relinquish          submit
## 10710                     rely          submit
## 10711               reparation          submit
## 10712                   repent          submit
## 10713               repentance          submit
## 10714                  request          submit
## 10715                   resign          submit
## 10716                  respect          submit
## 10717               respectful          submit
## 10718                  respond          submit
## 10719                   revere          submit
## 10720                reverence          submit
## 10721                 reverent          submit
## 10722               reverently          submit
## 10723                sacrifice          submit
## 10724                      sag          submit
## 10725                   salute          submit
## 10726                      sap          submit
## 10727                    scare          submit
## 10728                   scared          submit
## 10729                secretary          submit
## 10730                  servant          submit
## 10731                    serve          submit
## 10732                  service          submit
## 10733                servitude          submit
## 10734                    slave          submit
## 10735                  slavery          submit
## 10736                    stand          submit
## 10737                  stomach          submit
## 10738                    stood          submit
## 10739                  student          submit
## 10740               subjection          submit
## 10741                subjugate          submit
## 10742              subjugation          submit
## 10743               submissive          submit
## 10744                   submit          submit
## 10745              subordinate          submit
## 10746             subservience          submit
## 10747                  succumb          submit
## 10748                   sucker          submit
## 10749                   suffer          submit
## 10750                 sufferer          submit
## 10751                  suicide          submit
## 10752                supporter          submit
## 10753                  suppose          submit
## 10754                surrender          submit
## 10755                 thankful          submit
## 10756                     tire          submit
## 10757                    tired          submit
## 10758                  tremble          submit
## 10759                  tribute          submit
## 10760                     true          submit
## 10761                    trust          submit
## 10762                     turn          submit
## 10763            unconditional          submit
## 10764              uncontested          submit
## 10765                    under          submit
## 10766                  undergo          submit
## 10767                undergone          submit
## 10768            undergraduate          submit
## 10769                underwent          submit
## 10770              unfortunate          submit
## 10771             unsuccessful          submit
## 10772                 venerate          submit
## 10773                   victim          submit
## 10774                volunteer          submit
## 10775            vulnerability          submit
## 10776               vulnerable          submit
## 10777                     wait          submit
## 10778                   waiter          submit
## 10779                   weaken          submit
## 10780                   weakly          submit
## 10781                    weary          submit
## 10782                    whine          submit
## 10783                     whip          submit
## 10784                  willing          submit
## 10785              willingness          submit
## 10786                  wishful          submit
## 10787                 withdraw          submit
## 10788                withdrawn          submit
## 10789                 withdrew          submit
## 10790                     word          submit
## 10791                   worsen          submit
## 10792                  worship          submit
## 10793                    yield          submit
## 10794                  abandon            weak
## 10795              abandonment            weak
## 10796                 abdicate            weak
## 10797                   abject            weak
## 10798                  abscond            weak
## 10799                  absence            weak
## 10800                   absent            weak
## 10801            absent-minded            weak
## 10802                 absentee            weak
## 10803                   addict            weak
## 10804                addiction            weak
## 10805                    admit            weak
## 10806               affliction            weak
## 10807                   afraid            weak
## 10808                    alibi            weak
## 10809                   allege            weak
## 10810                    alone            weak
## 10811                  amateur            weak
## 10812               ambivalent            weak
## 10813                  ancient            weak
## 10814               antiquated            weak
## 10815                  anxiety            weak
## 10816                  anxious            weak
## 10817              anxiousness            weak
## 10818                    apart            weak
## 10819                apathetic            weak
## 10820                   apathy            weak
## 10821               apologetic            weak
## 10822                apologize            weak
## 10823                  apology            weak
## 10824             apprehensive            weak
## 10825                  ashamed            weak
## 10826                   asleep            weak
## 10827                   astray            weak
## 10828                  asunder            weak
## 10829                  atrophy            weak
## 10830                  average            weak
## 10831                    avert            weak
## 10832                    avoid            weak
## 10833                avoidance            weak
## 10834                  awkward            weak
## 10835              awkwardness            weak
## 10836                     baby            weak
## 10837                 backward            weak
## 10838             backwardness            weak
## 10839                     bail            weak
## 10840                     balk            weak
## 10841                     bane            weak
## 10842                   banter            weak
## 10843                   barren            weak
## 10844                  bashful            weak
## 10845                     beat            weak
## 10846                      beg            weak
## 10847                   beggar            weak
## 10848                   belong            weak
## 10849                     bend            weak
## 10850                     bent            weak
## 10851              bereavement            weak
## 10852                   bereft            weak
## 10853                  beseech            weak
## 10854                      bit            weak
## 10855                    bland            weak
## 10856                    bleed            weak
## 10857                  blemish            weak
## 10858                    blind            weak
## 10859                blindness            weak
## 10860                blockhead            weak
## 10861                bloodshed            weak
## 10862                  blunder            weak
## 10863                     blur            weak
## 10864                  bondage            weak
## 10865                   borrow            weak
## 10866                    bound            weak
## 10867                      bow            weak
## 10868                    break            weak
## 10869                breakdown            weak
## 10870                  brittle            weak
## 10871                    broke            weak
## 10872           broken-hearted            weak
## 10873                   buckle            weak
## 10874                      bum            weak
## 10875                   bungle            weak
## 10876                   burden            weak
## 10877                    can't            weak
## 10878                   cannot            weak
## 10879               capitulate            weak
## 10880                  captive            weak
## 10881                   careen            weak
## 10882                     cave            weak
## 10883                    cease            weak
## 10884                    cheap            weak
## 10885                  cheapen            weak
## 10886                    choke            weak
## 10887                  chronic            weak
## 10888                    cling            weak
## 10889                    clung            weak
## 10890                 collapse            weak
## 10891                 commoner            weak
## 10892                  concede            weak
## 10893               concession            weak
## 10894                  confess            weak
## 10895               confession            weak
## 10896                  conform            weak
## 10897               conformity            weak
## 10898                  confuse            weak
## 10899                confusion            weak
## 10900                  control            weak
## 10901                  convict            weak
## 10902                    covet            weak
## 10903                   coward            weak
## 10904                    crack            weak
## 10905                    crave            weak
## 10906                    crawl            weak
## 10907                credulous            weak
## 10908                    creep            weak
## 10909                    crept            weak
## 10910                  crumble            weak
## 10911                  crumple            weak
## 10912                     dead            weak
## 10913                 deadlock            weak
## 10914                   dearth            weak
## 10915                    death            weak
## 10916                     debt            weak
## 10917                   debtor            weak
## 10918                    decay            weak
## 10919                  decline            weak
## 10920                 decrease            weak
## 10921                   defect            weak
## 10922                defective            weak
## 10923                defendant            weak
## 10924                defensive            weak
## 10925               deficiency            weak
## 10926                deficient            weak
## 10927                  deficit            weak
## 10928               degenerate            weak
## 10929                 dejected            weak
## 10930                    delay            weak
## 10931                 delicate            weak
## 10932              delinquency            weak
## 10933               delinquent            weak
## 10934                 delirium            weak
## 10935                 delusion            weak
## 10936                   demise            weak
## 10937                   depend            weak
## 10938               dependence            weak
## 10939                dependent            weak
## 10940               depreciate            weak
## 10941                  depress            weak
## 10942               depression            weak
## 10943                  descend            weak
## 10944                   desert            weak
## 10945                 desolate            weak
## 10946                  despair            weak
## 10947                desperate            weak
## 10948                destitute            weak
## 10949                   devoid            weak
## 10950                 diminish            weak
## 10951                     dire            weak
## 10952             disadvantage            weak
## 10953          disadvantageous            weak
## 10954                 disaster            weak
## 10955               disastrous            weak
## 10956             disconcerted            weak
## 10957               discontent            weak
## 10958                  discord            weak
## 10959           discouragement            weak
## 10960                 diseased            weak
## 10961                 disgrace            weak
## 10962                  disgust            weak
## 10963               dishearten            weak
## 10964                dishonest            weak
## 10965                 dishonor            weak
## 10966             disingenuous            weak
## 10967                   dismal            weak
## 10968                 disorder            weak
## 10969             disorganized            weak
## 10970           dispensability            weak
## 10971                displease            weak
## 10972              displeasure            weak
## 10973               dissatisfy            weak
## 10974                 distress            weak
## 10975                   divide            weak
## 10976                 division            weak
## 10977                     doom            weak
## 10978                 doubtful            weak
## 10979                 dreadful            weak
## 10980                    droop            weak
## 10981                     drop            weak
## 10982                    drown            weak
## 10983                    drunk            weak
## 10984                 drunkard            weak
## 10985                  drunken            weak
## 10986                     dull            weak
## 10987                     dumb            weak
## 10988                    dying            weak
## 10989                     edge            weak
## 10990                  elastic            weak
## 10991               elasticity            weak
## 10992                  elderly            weak
## 10993            embarrassment            weak
## 10994                 employee            weak
## 10995                    empty            weak
## 10996                  entreat            weak
## 10997                equivocal            weak
## 10998                      err            weak
## 10999                erroneous            weak
## 11000                   excuse            weak
## 11001                   expire            weak
## 11002                     fail            weak
## 11003                  failure            weak
## 11004                    faint            weak
## 11005                     fall            weak
## 11006                   falter            weak
## 11007                   famine            weak
## 11008                  fatigue            weak
## 11009                    fault            weak
## 11010                     fear            weak
## 11011                  fearful            weak
## 11012                   feeble            weak
## 11013                 feminine            weak
## 11014                    fever            weak
## 11015                 feverish            weak
## 11016                      few            weak
## 11017                   fiasco            weak
## 11018                   fickle            weak
## 11019                   fidget            weak
## 11020                  flatter            weak
## 11021                 flattery            weak
## 11022                     flaw            weak
## 11023                     fled            weak
## 11024                     flee            weak
## 11025                   flimsy            weak
## 11026                 flounder            weak
## 11027                   foible            weak
## 11028                   follow            weak
## 11029                     fool            weak
## 11030                  foolish            weak
## 11031              foolishness            weak
## 11032                  forfeit            weak
## 11033                   forget            weak
## 11034                   forgot            weak
## 11035                forgotten            weak
## 11036                  forlorn            weak
## 11037                  forsake            weak
## 11038                  founder            weak
## 11039                 fracture            weak
## 11040                  fragile            weak
## 11041                    frail            weak
## 11042                  frantic            weak
## 11043                    fraud            weak
## 11044               fraudulent            weak
## 11045                     fret            weak
## 11046                  fretful            weak
## 11047                fruitless            weak
## 11048                   fumble            weak
## 11049                     fuss            weak
## 11050                 futility            weak
## 11051                   gentle            weak
## 11052                 gingerly            weak
## 11053                     give            weak
## 11054                    grief            weak
## 11055                   guilty            weak
## 11056                 gullible            weak
## 11057                     hack            weak
## 11058                  haggard            weak
## 11059                  halfway            weak
## 11060                  handful            weak
## 11061                 handicap            weak
## 11062                     hang            weak
## 11063                  hapless            weak
## 11064                     hard            weak
## 11065                 harmless            weak
## 11066                     have            weak
## 11067                 haziness            weak
## 11068                    hedge            weak
## 11069                     help            weak
## 11070                 helpless            weak
## 11071             helplessness            weak
## 11072                 hesitant            weak
## 11073                 hesitate            weak
## 11074               hesitation            weak
## 11075                     hide            weak
## 11076                   hobble            weak
## 11077                     hole            weak
## 11078                   hollow            weak
## 11079                 hopeless            weak
## 11080                   huddle            weak
## 11081                   humble            weak
## 11082                     hung            weak
## 11083               hysterical            weak
## 11084                ignorance            weak
## 11085                 ignorant            weak
## 11086                      ill            weak
## 11087               illiterate            weak
## 11088                  illness            weak
## 11089                illogical            weak
## 11090                imitation            weak
## 11091                 immature            weak
## 11092                  implore            weak
## 11093             imprisonment            weak
## 11094                inability            weak
## 11095               inadequate            weak
## 11096                incapable            weak
## 11097               incomplete            weak
## 11098                incorrect            weak
## 11099                 indebted            weak
## 11100               indecision            weak
## 11101               indecisive            weak
## 11102           indecisiveness            weak
## 11103                 indirect            weak
## 11104                   infant            weak
## 11105                 inferior            weak
## 11106              inferiority            weak
## 11107                injurious            weak
## 11108                   injury            weak
## 11109                 insecure            weak
## 11110               insecurity            weak
## 11111            insignificant            weak
## 11112              instability            weak
## 11113                 instable            weak
## 11114            insufficiency            weak
## 11115             insufficient            weak
## 11116                  interim            weak
## 11117              intolerable            weak
## 11118            irresponsible            weak
## 11119                    kneel            weak
## 11120                    knelt            weak
## 11121                     lack            weak
## 11122                      lag            weak
## 11123                     lame            weak
## 11124                 languish            weak
## 11125                   lazily            weak
## 11126                     lazy            weak
## 11127                     lean            weak
## 11128                    least            weak
## 11129                     less            weak
## 11130                liability            weak
## 11131                 lifeless            weak
## 11132                    light            weak
## 11133                    limit            weak
## 11134                     limp            weak
## 11135                   little            weak
## 11136                     lone            weak
## 11137               loneliness            weak
## 11138                   lonely            weak
## 11139                    loner            weak
## 11140                     long            weak
## 11141                     look            weak
## 11142                     lose            weak
## 11143                    loser            weak
## 11144                     loss            weak
## 11145                     lost            weak
## 11146                      low            weak
## 11147                    lower            weak
## 11148                    lowly            weak
## 11149                      mad            weak
## 11150              maladjusted            weak
## 11151            maladjustment            weak
## 11152                   malady            weak
## 11153                   meager            weak
## 11154              meaningless            weak
## 11155                 mediocre            weak
## 11156                     meek            weak
## 11157                     melt            weak
## 11158                   menial            weak
## 11159                     mere            weak
## 11160                     mind            weak
## 11161                  minimal            weak
## 11162                  minimum            weak
## 11163                    minor            weak
## 11164                 minority            weak
## 11165                miserable            weak
## 11166                   misery            weak
## 11167               misfortune            weak
## 11168                     miss            weak
## 11169                      mix            weak
## 11170                   modest            weak
## 11171                momentary            weak
## 11172                    mourn            weak
## 11173                   murmur            weak
## 11174                   mutter            weak
## 11175                  myself>            weak
## 11176                    naive            weak
## 11177                     name            weak
## 11178                   narrow            weak
## 11179                     need            weak
## 11180                    needy            weak
## 11181               negligible            weak
## 11182                  nervous            weak
## 11183              nervousness            weak
## 11184                  newborn            weak
## 11185                  nominal            weak
## 11186                  nothing            weak
## 11187                   novice            weak
## 11188                     obey            weak
## 11189                   oblige            weak
## 11190                 obsolete            weak
## 11191                 occasion            weak
## 11192               occasional            weak
## 11193                      old            weak
## 11194                 omission            weak
## 11195                     omit            weak
## 11196                     only            weak
## 11197                    order            weak
## 11198               overworked            weak
## 11199                      owe            weak
## 11200                     pale            weak
## 11201                   paltry            weak
## 11202                    panic            weak
## 11203                paralysis            weak
## 11204                paralyzed            weak
## 11205                 paranoid            weak
## 11206                  partial            weak
## 11207                     pass            weak
## 11208                    passe            weak
## 11209                  passive            weak
## 11210                 pathetic            weak
## 11211                  patient            weak
## 11212                    pause            weak
## 11213                      pay            weak
## 11214                  peasant            weak
## 11215                  perplex            weak
## 11216                 petition            weak
## 11217               petitioner            weak
## 11218                   phobia            weak
## 11219                    piece            weak
## 11220                  pitiful            weak
## 11221                     plea            weak
## 11222                    plead            weak
## 11223                     plod            weak
## 11224                pointless            weak
## 11225                   polite            weak
## 11226                     poor            weak
## 11227                  poverty            weak
## 11228                powerless            weak
## 11229               precarious            weak
## 11230                premature            weak
## 11231                    press            weak
## 11232                     prey            weak
## 11233                 prisoner            weak
## 11234                  private            weak
## 11235            procrastinate            weak
## 11236          procrastination            weak
## 11237              provisional            weak
## 11238                     puny            weak
## 11239               puzzlement            weak
## 11240                   quaint            weak
## 11241                 quandary            weak
## 11242                     quit            weak
## 11243                  quitter            weak
## 11244                   random            weak
## 11245                   recoil            weak
## 11246                reduction            weak
## 11247                  refugee            weak
## 11248                  regress            weak
## 11249               regression            weak
## 11250                   regret            weak
## 11251                  relapse            weak
## 11252                 relative            weak
## 11253                    relax            weak
## 11254                 reliance            weak
## 11255               relinquish            weak
## 11256                reluctant            weak
## 11257                     rely            weak
## 11258                   remote            weak
## 11259                  request            weak
## 11260                   resign            weak
## 11261                 restrict            weak
## 11262                  retreat            weak
## 11263                   revert            weak
## 11264               ridiculous            weak
## 11265                     ruin            weak
## 11266                      run            weak
## 11267                  runaway            weak
## 11268                  rupture            weak
## 11269                    rusty            weak
## 11270                      sag            weak
## 11271                     sank            weak
## 11272                      sap            weak
## 11273                    scant            weak
## 11274                scapegoat            weak
## 11275                     scar            weak
## 11276                   scarce            weak
## 11277                 scarcely            weak
## 11278                    scare            weak
## 11279                   scared            weak
## 11280                 scramble            weak
## 11281                  scratch            weak
## 11282                   scrawl            weak
## 11283                sentiment            weak
## 11284              sentimental            weak
## 11285                    serve            weak
## 11286                  service            weak
## 11287                servitude            weak
## 11288                   shabby            weak
## 11289                  shallow            weak
## 11290                    shift            weak
## 11291                    shirk            weak
## 11292                    shock            weak
## 11293                   shoddy            weak
## 11294                    short            weak
## 11295                 shortage            weak
## 11296             shortsighted            weak
## 11297                   shrank            weak
## 11298                   shrink            weak
## 11299                   shrunk            weak
## 11300                      shy            weak
## 11301                  shyness            weak
## 11302                     sick            weak
## 11303                   sickly            weak
## 11304                 sickness            weak
## 11305                    silly            weak
## 11306               simplistic            weak
## 11307                     sink            weak
## 11308                    slave            weak
## 11309                   sleazy            weak
## 11310                  slender            weak
## 11311                    slept            weak
## 11312                   slight            weak
## 11313                     slim            weak
## 11314                   sloppy            weak
## 11315                    sloth            weak
## 11316                 slothful            weak
## 11317                     slug            weak
## 11318                 sluggish            weak
## 11319                    small            weak
## 11320                     soft            weak
## 11321                   sorrow            weak
## 11322                    sorry            weak
## 11323               speechless            weak
## 11324                    spend            weak
## 11325                    split            weak
## 11326                 sporadic            weak
## 11327                  stagger            weak
## 11328                    stale            weak
## 11329                    stall            weak
## 11330               starvation            weak
## 11331                   starve            weak
## 11332                    stick            weak
## 11333                 straggle            weak
## 11334                straggler            weak
## 11335                 stricken            weak
## 11336                   strife            weak
## 11337                  stumble            weak
## 11338               subjection            weak
## 11339                subjugate            weak
## 11340              subjugation            weak
## 11341               submissive            weak
## 11342                   submit            weak
## 11343              subordinate            weak
## 11344             subservience            weak
## 11345                   subtle            weak
## 11346                  succumb            weak
## 11347                   sucker            weak
## 11348                   suffer            weak
## 11349                 sufferer            weak
## 11350                suffocate            weak
## 11351                     sunk            weak
## 11352                   sunken            weak
## 11353              superficial            weak
## 11354                  support            weak
## 11355                surrender            weak
## 11356                 surround            weak
## 11357              susceptible            weak
## 11358                temporary            weak
## 11359                   tender            weak
## 11360                  tension            weak
## 11361                tentative            weak
## 11362                     thin            weak
## 11363                    timid            weak
## 11364                     tiny            weak
## 11365                     tire            weak
## 11366                    tired            weak
## 11367                    tramp            weak
## 11368                  tremble            weak
## 11369                   trifle            weak
## 11370                  trivial            weak
## 11371                   unable            weak
## 11372             unaccustomed            weak
## 11373                    unarm            weak
## 11374                unassured            weak
## 11375                  unaware            weak
## 11376                uncertain            weak
## 11377              uncertainty            weak
## 11378                undecided            weak
## 11379          undependability            weak
## 11380             undependable            weak
## 11381                   uneasy            weak
## 11382               unemployed            weak
## 11383               unfaithful            weak
## 11384               unfamiliar            weak
## 11385               unfinished            weak
## 11386                    unfit            weak
## 11387              unfortunate            weak
## 11388                unguarded            weak
## 11389                unhealthy            weak
## 11390               uninformed            weak
## 11391                  unlucky            weak
## 11392               unprepared            weak
## 11393            unreliability            weak
## 11394               unreliable            weak
## 11395             unscrupulous            weak
## 11396                  unsound            weak
## 11397              unsoundness            weak
## 11398                 unstable            weak
## 11399             unsteadiness            weak
## 11400                 unsteady            weak
## 11401             unsuccessful            weak
## 11402                   unsure            weak
## 11403               unsureness            weak
## 11404                untrained            weak
## 11405                    upset            weak
## 11406                vacillate            weak
## 11407                 vagabond            weak
## 11408                  vagrant            weak
## 11409                    vague            weak
## 11410                vagueness            weak
## 11411                   victim            weak
## 11412            vulnerability            weak
## 11413               vulnerable            weak
## 11414                   wanton            weak
## 11415                    waste            weak
## 11416                    waver            weak
## 11417                  wayward            weak
## 11418                     weak            weak
## 11419                   weaken            weak
## 11420                   weakly            weak
## 11421                 weakness            weak
## 11422                weariness            weak
## 11423                wearisome            weak
## 11424                    weary            weak
## 11425                      wee            weak
## 11426                    whine            weak
## 11427                     whip            weak
## 11428                     wind            weak
## 11429                     wish            weak
## 11430                  wishful            weak
## 11431                 withdraw            weak
## 11432                withdrawn            weak
## 11433                 withdrew            weak
## 11434                   wither            weak
## 11435                     worn            weak
## 11436                  worrier            weak
## 11437                    worry            weak
## 11438                   worsen            weak
## 11439                    wound            weak
## 11440                    yield            weak

Join the qdap and the tidy_brown_sentiment tables.

This code joins the SentimentAnalysis lexicon and the tidy_brown_text tables and calculate the sentiment for every 10 sentences.

library(tidyr)

tidy_brown_qdap_sentiment <- tidy_brown_text %>%
  inner_join(qdap_lex) %>%
  count(text_id, index = linenumber %/% 10, sentiment) %>%
  pivot_wider(names_from = sentiment, values_from = n, values_fill = 0) %>% 
  mutate(sentiment = positive - negative, strength = strong - weak, amplify = amplification - deamplification)
## Joining with `by = join_by(word)`
## Warning in inner_join(., qdap_lex): Detected an unexpected many-to-many relationship between `x` and `y`.
## ℹ Row 2 of `x` matches multiple rows in `y`.
## ℹ Row 1424 of `y` matches multiple rows in `x`.
## ℹ If a many-to-many relationship is expected, set `relationship =
##   "many-to-many"` to silence this warning.
tidy_brown_qdap_sentiment
## # A tibble: 193 × 14
##    text_id index action negative positive power strong submit  weak
##    <chr>   <dbl>  <int>    <int>    <int> <int>  <int>  <int> <int>
##  1 cc14      135      1        2        1     1      0      0     0
##  2 cc14      136     14        9       12     5      8      3     5
##  3 cc14      137     12        2       12     1      4      0     2
##  4 cc14      138     10        8        8     5      8      2     2
##  5 cc14      139      7        4       12     4     10      1     4
##  6 cc14      140      3        3        3     1      2      4     1
##  7 cc14      141     15        7       19     3     18      1     4
##  8 cc14      142     11       11        6     3     13      0     3
##  9 cc14      143      7        3        5     2      8      2     0
## 10 cc14      144     15        3       10     0      9      1     2
## # ℹ 183 more rows
## # ℹ 5 more variables: amplification <int>, deamplification <int>,
## #   sentiment <int>, strength <int>, amplify <int>

Overall sentiments

The overall sentiments is similar to that dipicted by the mpqa lexicon

library(ggplot2)

ggplot(tidy_brown_qdap_sentiment, aes(index, sentiment, fill = text_id)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~text_id, ncol = 4, scales = "free_x") + 
  labs(title = 'Overall sentiments (positive - negative)')

### Strength Sentiment analysis The plots shows that there is a predominant use of strength words than words that express weakness through out each of the texts.

library(ggplot2)

ggplot(tidy_brown_qdap_sentiment, aes(index, strength, fill = text_id)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~text_id, ncol = 4, scales = "free_x") + 
  labs(title = 'Distribution of strength sentiments (strong - weak)')

### Amplification Sentiment analysis The plots shows that there are few words in the texts that expressed amplifying or de-amplifying words..

library(ggplot2)

ggplot(tidy_brown_qdap_sentiment, aes(index, amplify, fill = text_id)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~text_id, ncol = 4, scales = "free_x") + 
  labs(title = 'Distribution of amplification Sentiments (amplification - de-amplification)')