2023-07-20

Class Plan

  • Data activity (10 min)
  • Review Text Mining (20 min)
  • Extracting Reddit Data (20 min)
  • Break (5 min)
  • Introduction to Sentiment Analysis (25 min)
  • Discuss Cape Town Water Crisis (10 min, or push to Thursday)
  • Final project time (Remainder)

Week 4 Groups!

print.data.frame(groups)
##               group 1                 group 2                 group 3
## 1         Tian, Zerui         Gnanam, Akash Y               Su, Barry
## 2     Knutson, Blue C   Leong, Wen Hou Lester    Dotson, Bianca Ciara
## 3        Shah, Jainam   Widodo, Ignazio Marco Alsayegh, Aisha E H M I
## 4 Andrew Yu Ming Xin, Spindler, Laine Addison     Albertini, Federico
##            group 4                   group 5                  group 6
## 1    Cai, Qingyuan              Ng, Michelle                         
## 2    Ning, Zhi Yan    Cortez, Hugo Alexander Huynh Le Hue Tam, Vivian
## 3                  Saccone, Alexander Connor           Somyurek, Ecem
## 4 Wan Rosli, Nadia           Tan, Zheng Yang             Gupta, Umang
##                            group 7
## 1              Premkrishna, Shrish
## 2 Ramos, Jessica Andria Potestades
## 3               Jun, Ernest Ng Wei
## 4                    Lim, Fang Jan

Data Activity

  • Task: communicate a message about the data using a visual approach of your choosing.
  • Consider: There is too much information to convey here! What is important and what is not?
  • Visualization does not need to be complete!

Data Visualization

  • From the Economist:
  • What could be improved here?

Data Visualization

Data Visualization

Review of Text Mining

Review of Text Mining

  • Let’s create a fake dataset just to review the principals
# create dataframe
df <- data.frame(article = "Soc 128d", 
                 text = c("In this class, we learned about text mining.",
                          "Text mining is a great way to explore text.",
                          "Text mining is fun!"))

Review of Text Mining

  • What should we do next?
  • Let’s take a look
# take a look at dataframe
print(df)
##    article                                         text
## 1 Soc 128d In this class, we learned about text mining.
## 2 Soc 128d  Text mining is a great way to explore text.
## 3 Soc 128d                          Text mining is fun!

Review of Text Mining

  • Make it tidytext!
  • Take 3 minutes to make dataframe tidy
  • Are there alternative ways to write the code below?
  • What if we wanted characters instead of words?
library(tidytext)
library(dplyr)
library(magrittr)

# unnest tokens
tidy_df <- df %>% 
  unnest_tokens(word, text)


# remove stop words
tidy_df %<>%
  anti_join(stop_words)

Review of Text Mining

  • Let’s take another look!
# take another look
print(tidy_df)
##     article    word
## 1  Soc 128d   class
## 2  Soc 128d learned
## 3  Soc 128d    text
## 4  Soc 128d  mining
## 5  Soc 128d    text
## 6  Soc 128d  mining
## 7  Soc 128d explore
## 8  Soc 128d    text
## 9  Soc 128d    text
## 10 Soc 128d  mining
## 11 Soc 128d     fun

Extracting Data from Reddit

Extracting Data From Reddit

  • Just in case there are API issues, can download the data from Canvas
  • Files/Data/climate_comments.Rdata
#read climate change comments and threads 
load("climate_comments.Rdata")

Extracting Data From Reddit

  • Only thing required is RedditExtractoR package!
  • First, let’s find the subreddits related to climate change
library(RedditExtractoR)
# find climate change subreddits
climate_subreddits <- find_subreddits("climate change")

Extracting Data from Reddit

  • There are two ways to get urls
  • First, search by keyword
# get climate subreddit urls
climate_urls <- find_thread_urls("climate change")

Extracting Data from Reddit

  • There are two ways to get urls
  • First, search by keyword
  • Second, search within a subreddit
# get climate subreddit urls
climate_urls <- find_thread_urls(subreddit = "climate", period = "all")

Extracting Data from Reddit

  • Now that we have urls, let’s get the content
# get climate subreddit urls
climate_comments <- get_thread_content(climate_urls$url)

Extracting Data from Reddit

  • Take 5 minutes in groups to pull Reddit data
  • Try pulling urls from both a subreddit and by keywords
  • Try getting content for a keyword other than “climate change”
  • If not working, be sure to load() the climate_comments.Rdata file from Canvas!

Extracting Data from Reddit

  • We want to look at the content!
  • But what type of object do we have?
# get climate subreddit urls
class(climate_comments)
## [1] "list"

Extracting Data from Reddit

# get climate subreddit urls
names(climate_comments$comments)
##  [1] "url"        "author"     "date"       "timestamp"  "score"     
##  [6] "upvotes"    "downvotes"  "golds"      "comment"    "comment_id"

Extracting Data from Reddit

# get climate subreddit urls
names(climate_comments$threads)
##  [1] "url"                   "author"                "date"                 
##  [4] "timestamp"             "title"                 "text"                 
##  [7] "subreddit"             "score"                 "upvotes"              
## [10] "downvotes"             "up_ratio"              "total_awards_received"
## [13] "golds"                 "cross_posts"           "comments"

Extracting Data from Reddit

  • Let’s put it in TidyText format!
# tidy comments 
tidy_comments <- climate_comments$comments %>%
  as.data.frame() %>%
  unnest_tokens(word, comment) %>%
  anti_join(stop_words)

Sentiment Analysis

Sentiment Analysis

  • What is sentiment analysis?
  • A way to analyze sentiments/emotions using text data
  • Three “sentiment lexicons” come with the tidytext package: AFINN, Bing, and NRC
  • Let’s explore these

Sentiment Analysis

  • AFINN
  • Numeric scale, ranging from negative (-5) to positive (5)
# look at afinn lexicon
get_sentiments("afinn")
## # A tibble: 2,477 × 2
##    word       value
##    <chr>      <dbl>
##  1 abandon       -2
##  2 abandoned     -2
##  3 abandons      -2
##  4 abducted      -2
##  5 abduction     -2
##  6 abductions    -2
##  7 abhor         -3
##  8 abhorred      -3
##  9 abhorrent     -3
## 10 abhors        -3
## # ℹ 2,467 more rows

Sentiment Analysis

  • Bing
  • Positive/Negative
# look at bing lexicon
get_sentiments("bing")
## # A tibble: 6,786 × 2
##    word        sentiment
##    <chr>       <chr>    
##  1 2-faces     negative 
##  2 abnormal    negative 
##  3 abolish     negative 
##  4 abominable  negative 
##  5 abominably  negative 
##  6 abominate   negative 
##  7 abomination negative 
##  8 abort       negative 
##  9 aborted     negative 
## 10 aborts      negative 
## # ℹ 6,776 more rows

Sentiment Analysis

  • NRC
  • Categories: positive, negative, anger, anticipation, disgust, fear, joy, sadness, surprise, and trust
# look at nrc lexicon
get_sentiments("nrc")
## # A tibble: 13,872 × 2
##    word        sentiment
##    <chr>       <chr>    
##  1 abacus      trust    
##  2 abandon     fear     
##  3 abandon     negative 
##  4 abandon     sadness  
##  5 abandoned   anger    
##  6 abandoned   fear     
##  7 abandoned   negative 
##  8 abandoned   sadness  
##  9 abandonment anger    
## 10 abandonment fear     
## # ℹ 13,862 more rows

Sentiment Analysis

  • Try joining the tidy climate change Reddit data with NRC lexicon
# join nrc with tidy comments
tidy_comments %<>%
  inner_join(get_sentiments("nrc"))

# take a look
tidy_comments %>%
  select(word, sentiment)
##                    word    sentiment
## 1                 civil     positive
## 2            discussion     positive
## 3              politics        anger
## 4             courteous     positive
## 5                debate     positive
## 6                 argue        anger
## 7                 argue     negative
## 8                attack        anger
## 9                attack         fear
## 10               attack     negative
## 11             personal        trust
## 12                troll        anger
## 13                troll         fear
## 14                troll     negative
## 15                 hate        anger
## 16                 hate      disgust
## 17                 hate         fear
## 18                 hate     negative
## 19                 hate      sadness
## 20               speech     positive
## 21                 harm         fear
## 22                 harm     negative
## 23             violence        anger
## 24             violence         fear
## 25             violence     negative
## 26             violence      sadness
## 27                death        anger
## 28                death anticipation
## 29                death      disgust
## 30                death         fear
## 31                death     negative
## 32                death      sadness
## 33                death     surprise
## 34                 rule         fear
## 35                 rule        trust
## 36               result anticipation
## 37                  ban     negative
## 38            violation        anger
## 39            violation         fear
## 40            violation     negative
## 41            violation      sadness
## 42            violation     surprise
## 43             politics        anger
## 44               action     positive
## 45              contact     positive
## 46             politics        anger
## 47                 time anticipation
## 48                spent     negative
## 49               reform     positive
## 50               reform     positive
## 51               senate        trust
## 52               reform     positive
## 53             organize     positive
## 54                 vote        anger
## 55                 vote anticipation
## 56                 vote          joy
## 57                 vote     negative
## 58                 vote     positive
## 59                 vote      sadness
## 60                 vote     surprise
## 61                 vote        trust
## 62            candidate     positive
## 63                level     positive
## 64                level        trust
## 65                 lost     negative
## 66                 lost      sadness
## 67                 vote        anger
## 68                 vote anticipation
## 69                 vote          joy
## 70                 vote     negative
## 71                 vote     positive
## 72                 vote      sadness
## 73                 vote     surprise
## 74                 vote        trust
## 75                 vote        anger
## 76                 vote anticipation
## 77                 vote          joy
## 78                 vote     negative
## 79                 vote     positive
## 80                 vote      sadness
## 81                 vote     surprise
## 82                 vote        trust
## 83           convenient     positive
## 84               remake     positive
## 85            excellent          joy
## 86            excellent     positive
## 87            excellent        trust
## 88                 debt     negative
## 89                 debt      sadness
## 90                  ass     negative
## 91                money        anger
## 92                money anticipation
## 93                money          joy
## 94                money     positive
## 95                money     surprise
## 96                money        trust
## 97                  cap anticipation
## 98                  cap        trust
## 99              illegal        anger
## 100             illegal      disgust
## 101             illegal         fear
## 102             illegal     negative
## 103             illegal      sadness
## 104             heavily     negative
## 105          discussion     positive
## 106            personal        trust
## 107            personal        trust
## 108          discussion     positive
## 109            academic     positive
## 110            academic        trust
## 111              degree     positive
## 112           expertise     positive
## 113           expertise        trust
## 114              author     positive
## 115              author        trust
## 116              action     positive
## 117             contact     positive
## 118            favorite          joy
## 119            favorite     positive
## 120            favorite        trust
## 121                 bad        anger
## 122                 bad      disgust
## 123                 bad         fear
## 124                 bad     negative
## 125                 bad      sadness
## 126               catch     surprise
## 127                beer          joy
## 128                beer     positive
## 129          intolerant        anger
## 130          intolerant      disgust
## 131          intolerant         fear
## 132          intolerant     negative
## 133          intolerant      sadness
## 134              friend          joy
## 135              friend     positive
## 136              friend        trust
## 137                beer          joy
## 138                beer     positive
## 139               shout        anger
## 140               shout     surprise
## 141               grist     positive
## 142                beer          joy
## 143                beer     positive
## 144                lack     negative
## 145             convert     positive
## 146               sugar     positive
## 147               guess     surprise
## 148              decent     positive
## 149                fall     negative
## 150                fall      sadness
## 151                soil      disgust
## 152                soil     negative
## 153                grow anticipation
## 154                grow          joy
## 155                grow     positive
## 156                grow        trust
## 157            relative        trust
## 158           chocolate anticipation
## 159           chocolate          joy
## 160           chocolate     positive
## 161           chocolate        trust
## 162         traditional     positive
## 163                time anticipation
## 164             pioneer     positive
## 165                evil        anger
## 166                evil      disgust
## 167                evil         fear
## 168                evil     negative
## 169                evil      sadness
## 170                evil        anger
## 171                evil      disgust
## 172                evil         fear
## 173                evil     negative
## 174                evil      sadness
## 175                glad anticipation
## 176                glad          joy
## 177                glad     positive
## 178              cancel     negative
## 179              cancel      sadness
## 180            vacation anticipation
## 181            vacation          joy
## 182            vacation     positive
## 183               death        anger
## 184               death anticipation
## 185               death      disgust
## 186               death         fear
## 187               death     negative
## 188               death      sadness
## 189               death     surprise
## 190               grave         fear
## 191               grave     negative
## 192               grave      sadness
## 193             council anticipation
## 194             council     positive
## 195             council        trust
## 196          supporting     positive
## 197          supporting        trust
## 198             attempt anticipation
## 199           challenge        anger
## 200           challenge         fear
## 201           challenge     negative
## 202            religion        trust
## 203           surprised     surprise
## 204           expecting anticipation
## 205                 die         fear
## 206                 die     negative
## 207                 die      sadness
## 208             attempt anticipation
## 209                real     positive
## 210                real        trust
## 211               fight        anger
## 212               fight         fear
## 213               fight     negative
## 214        infiltration     negative
## 215        infiltration     positive
## 216              pretty anticipation
## 217              pretty          joy
## 218              pretty     positive
## 219              pretty        trust
## 220           effective     positive
## 221           effective        trust
## 222             hostile        anger
## 223             hostile      disgust
## 224             hostile         fear
## 225             hostile     negative
## 226             culture     positive
## 227                lose        anger
## 228                lose      disgust
## 229                lose         fear
## 230                lose     negative
## 231                lose      sadness
## 232                lose     surprise
## 233               hairy      disgust
## 234               hairy     negative
## 235           curiosity anticipation
## 236           curiosity     positive
## 237           curiosity     surprise
## 238               share anticipation
## 239               share          joy
## 240               share     positive
## 241               share        trust
## 242               guess     surprise
## 243               sense     positive
## 244               alive anticipation
## 245               alive          joy
## 246               alive     positive
## 247               alive        trust
## 248               cruel        anger
## 249               cruel      disgust
## 250               cruel         fear
## 251               cruel     negative
## 252               cruel      sadness
## 253          punishment        anger
## 254          punishment      disgust
## 255          punishment         fear
## 256          punishment     negative
## 257             fitting anticipation
## 258             fitting          joy
## 259             fitting     positive
## 260             fitting        trust
## 261          punishment        anger
## 262          punishment      disgust
## 263          punishment         fear
## 264          punishment     negative
## 265               child anticipation
## 266               child          joy
## 267               child     positive
## 268               alive anticipation
## 269               alive          joy
## 270               alive     positive
## 271               alive        trust
## 272               death        anger
## 273               death anticipation
## 274               death      disgust
## 275               death         fear
## 276               death     negative
## 277               death      sadness
## 278               death     surprise
## 279        imprisonment        anger
## 280        imprisonment      disgust
## 281        imprisonment         fear
## 282        imprisonment     negative
## 283        imprisonment      sadness
## 284               cruel        anger
## 285               cruel      disgust
## 286               cruel         fear
## 287               cruel     negative
## 288               cruel      sadness
## 289         confinement        anger
## 290         confinement         fear
## 291         confinement     negative
## 292         confinement      sadness
## 293           isolation     negative
## 294           isolation      sadness
## 295                 war         fear
## 296                 war     negative
## 297          technology     positive
## 298               react        anger
## 299               react         fear
## 300           isolation     negative
## 301           isolation      sadness
## 302             adverse        anger
## 303             adverse      disgust
## 304             adverse         fear
## 305             adverse     negative
## 306             adverse      sadness
## 307                loss        anger
## 308                loss         fear
## 309                loss     negative
## 310                loss      sadness
## 311            continue anticipation
## 312            continue     positive
## 313            continue        trust
## 314              punish         fear
## 315              punish     negative
## 316                dare anticipation
## 317                dare        trust
## 318                pain         fear
## 319                pain     negative
## 320                pain      sadness
## 321            spelling     positive
## 322             grammar        trust
## 323             grammar        trust
## 324          compliment anticipation
## 325          compliment          joy
## 326          compliment     positive
## 327          compliment     surprise
## 328          compliment        trust
## 329                 sir     positive
## 330                 sir        trust
## 331               draft anticipation
## 332                flow     positive
## 333               usual     positive
## 334               usual        trust
## 335               catch     surprise
## 336              change         fear
## 337         distracting        anger
## 338         distracting anticipation
## 339         distracting     negative
## 340              pretty anticipation
## 341              pretty          joy
## 342              pretty     positive
## 343              pretty        trust
## 344           impatient anticipation
## 345           impatient     negative
## 346           exhausted     negative
## 347           exhausted      sadness
## 348           traveling     positive
## 349             cutting        anger
## 350             cutting      disgust
## 351             cutting         fear
## 352             cutting     negative
## 353             cutting      sadness
## 354            annoying        anger
## 355            annoying     negative
## 356               armor         fear
## 357               armor     positive
## 358               armor        trust
## 359               weird      disgust
## 360               weird     negative
## 361                 god anticipation
## 362                 god         fear
## 363                 god          joy
## 364                 god     positive
## 365                 god        trust
## 366           eradicate        anger
## 367           eradicate     negative
## 368         theological        trust
## 369               major     positive
## 370               worth     positive
## 371                 god anticipation
## 372                 god         fear
## 373                 god          joy
## 374                 god     positive
## 375                 god        trust
## 376             spirits anticipation
## 377             spirits          joy
## 378             spirits     positive
## 379             spirits     surprise
## 380                true          joy
## 381                true     positive
## 382                true        trust
## 383           principal     positive
## 384           principal        trust
## 385           extensive     positive
## 386             enslave     negative
## 387         exterminate         fear
## 388         exterminate     negative
## 389         exterminate      sadness
## 390          commission        trust
## 391            republic     negative
## 392           recommend     positive
## 393           recommend        trust
## 394             warrior        anger
## 395             warrior         fear
## 396             warrior     positive
## 397           principal     positive
## 398           principal        trust
## 399                 job     positive
## 400                rule         fear
## 401                rule        trust
## 402           principal     positive
## 403           principal        trust
## 404                main     positive
## 405             partner     positive
## 406        professional     positive
## 407        professional        trust
## 408               couch      sadness
## 409               offer     positive
## 410           surrender         fear
## 411           surrender     negative
## 412           surrender      sadness
## 413            republic     negative
## 414             warrior        anger
## 415             warrior         fear
## 416             warrior     positive
## 417            republic     negative
## 418             warfare        anger
## 419             warfare         fear
## 420             warfare     negative
## 421             warfare      sadness
## 422            republic     negative
## 423               sweat         fear
## 424                join     positive
## 425                rest     positive
## 426               peace anticipation
## 427               peace          joy
## 428               peace     positive
## 429               peace        trust
## 430                hope anticipation
## 431                hope          joy
## 432                hope     positive
## 433                hope     surprise
## 434                hope        trust
## 435           recommend     positive
## 436           recommend        trust
## 437             reading     positive
## 438             reading     positive
## 439               frank     positive
## 440               frank        trust
## 441        infiltration     negative
## 442        infiltration     positive
## 443           execution        anger
## 444           execution         fear
## 445           execution     negative
## 446           execution      sadness
## 447           execution        trust
## 448          restrained         fear
## 449              escape anticipation
## 450              escape         fear
## 451              escape     negative
## 452              escape     positive
## 453              system        trust
## 454               alive anticipation
## 455               alive          joy
## 456               alive     positive
## 457               alive        trust
## 458            expected anticipation
## 459                save          joy
## 460                save     positive
## 461                save        trust
## 462              series        trust
## 463        accidentally     surprise
## 464                main     positive
## 465          antagonist        anger
## 466          antagonist     negative
## 467          restrained         fear
## 468              hooked     negative
## 469               alive anticipation
## 470               alive          joy
## 471               alive     positive
## 472               alive        trust
## 473                food          joy
## 474                food     positive
## 475                food        trust
## 476               waste      disgust
## 477               waste     negative
## 478               cross        anger
## 479               cross         fear
## 480               cross     negative
## 481               cross      sadness
## 482              buried         fear
## 483              buried     negative
## 484              buried      sadness
## 485               alive anticipation
## 486               alive          joy
## 487               alive     positive
## 488               alive        trust
## 489                 die         fear
## 490                 die     negative
## 491                 die      sadness
## 492         suffocation        anger
## 493         suffocation         fear
## 494         suffocation     negative
## 495              prefer     positive
## 496              prefer        trust
## 497              thirst anticipation
## 498              thirst      sadness
## 499              thirst     surprise
## 500          horrifying      disgust
## 501          horrifying         fear
## 502          horrifying     negative
## 503          horrifying      sadness
## 504               level     positive
## 505               level        trust
## 506                food          joy
## 507                food     positive
## 508                food        trust
## 509            punished        anger
## 510            punished anticipation
## 511            punished      disgust
## 512            punished         fear
## 513            punished     negative
## 514            punished      sadness
## 515                 die         fear
## 516                 die     negative
## 517                 die      sadness
## 518            inspired          joy
## 519            inspired     positive
## 520            inspired     surprise
## 521            inspired        trust
## 522              hooked     negative
## 523              system        trust
## 524            distress        anger
## 525            distress      disgust
## 526            distress         fear
## 527            distress     negative
## 528            distress      sadness
## 529            distress     surprise
## 530                time anticipation
## 531              system        trust
## 532                 die         fear
## 533                 die     negative
## 534                 die      sadness
## 535           including     positive
## 536                 war         fear
## 537                 war     negative
## 538                 war         fear
## 539                 war     negative
## 540                 war         fear
## 541                 war     negative
## 542            building     positive
## 543                 war         fear
## 544                 war     negative
## 545                 war         fear
## 546                 war     negative
## 547            massacre        anger
## 548            massacre      disgust
## 549            massacre         fear
## 550            massacre     negative
## 551            massacre      sadness
## 552                 war         fear
## 553                 war     negative
## 554                love          joy
## 555                love     positive
## 556                 war         fear
## 557                 war     negative
## 558                 war         fear
## 559                 war     negative
## 560                fall     negative
## 561                fall      sadness
## 562              dinner     positive
## 563                 war         fear
## 564                 war     negative
## 565                 war         fear
## 566                 war     negative
## 567                star anticipation
## 568                star          joy
## 569                star     positive
## 570                star        trust
## 571                 war         fear
## 572                 war     negative
## 573       authorization     positive
## 574       authorization        trust
## 575                star anticipation
## 576                star          joy
## 577                star     positive
## 578                star        trust
## 579             council anticipation
## 580             council     positive
## 581             council        trust
## 582                 war         fear
## 583                 war     negative
## 584                 war         fear
## 585                 war     negative
## 586                rage        anger
## 587                rage     negative
## 588                 war         fear
## 589                 war     negative
## 590                 war         fear
## 591                 war     negative
## 592               words        anger
## 593               words     negative
## 594                 war         fear
## 595                 war     negative
## 596                star anticipation
## 597                star          joy
## 598                star     positive
## 599                star        trust
## 600             council anticipation
## 601             council     positive
## 602             council        trust
## 603              waffle        anger
## 604              waffle     negative
## 605              waffle      sadness
## 606             subject     negative
## 607              waffle        anger
## 608              waffle     negative
## 609              waffle      sadness
## 610             subject     negative
## 611           subscribe anticipation
## 612           subscribe anticipation
## 613                time anticipation
## 614             subject     negative
## 615             subject     negative
## 616             subject     negative
## 617              broken        anger
## 618              broken         fear
## 619              broken     negative
## 620              broken      sadness
## 621          discussion     positive
## 622           challenge        anger
## 623           challenge         fear
## 624           challenge     negative
## 625             liberal     negative
## 626             liberal     positive
## 627          capitalist     positive
## 628             liberal     negative
## 629             liberal     positive
## 630          capitalist     positive
## 631          prohibited        anger
## 632          prohibited      disgust
## 633          prohibited         fear
## 634          prohibited     negative
## 635              debate     positive
## 636           socialism      disgust
## 637           socialism         fear
## 638               faith anticipation
## 639               faith          joy
## 640               faith     positive
## 641               faith        trust
## 642              policy        trust
## 643             failure      disgust
## 644             failure         fear
## 645             failure     negative
## 646             failure      sadness
## 647             respect anticipation
## 648             respect          joy
## 649             respect     positive
## 650             respect        trust
## 651              result anticipation
## 652                 ban     negative
## 653              action     positive
## 654             contact     positive
## 655                torn     negative
## 656          depressing      disgust
## 657          depressing     negative
## 658          depressing      sadness
## 659             equally     positive
## 660          constantly        trust
## 661               fight        anger
## 662               fight         fear
## 663               fight     negative
## 664               worse         fear
## 665               worse     negative
## 666               worse      sadness
## 667              attack        anger
## 668              attack         fear
## 669              attack     negative
## 670        incompetence     negative
## 671              malice        anger
## 672              malice         fear
## 673              malice     negative
## 674                hurt        anger
## 675                hurt         fear
## 676                hurt     negative
## 677                hurt      sadness
## 678               blame        anger
## 679               blame      disgust
## 680               blame     negative
## 681              mighty        anger
## 682              mighty         fear
## 683              mighty          joy
## 684              mighty     positive
## 685              mighty        trust
## 686                vote        anger
## 687                vote anticipation
## 688                vote          joy
## 689                vote     negative
## 690                vote     positive
## 691                vote      sadness
## 692                vote     surprise
## 693                vote        trust
## 694             supreme     positive
## 695               court        anger
## 696               court anticipation
## 697               court         fear
## 698               trump     surprise
## 699            momentum anticipation
## 700            momentum     positive
## 701            majority          joy
## 702            majority     positive
## 703            majority        trust
## 704                vote        anger
## 705                vote anticipation
## 706                vote          joy
## 707                vote     negative
## 708                vote     positive
## 709                vote      sadness
## 710                vote     surprise
## 711                vote        trust
## 712         responsible     positive
## 713         responsible        trust
## 714             obvious     positive
## 715             obvious        trust
## 716              choice     positive
## 717               trump     surprise
## 718               major     positive
## 719          capitalist     positive
## 720              crying     negative
## 721              crying      sadness
## 722                loss        anger
## 723                loss         fear
## 724                loss     negative
## 725                loss      sadness
## 726              crying     negative
## 727              crying      sadness
## 728                loss        anger
## 729                loss         fear
## 730                loss     negative
## 731                loss      sadness
## 732                lost     negative
## 733                lost      sadness
## 734            horrible        anger
## 735            horrible      disgust
## 736            horrible         fear
## 737            horrible     negative
## 738               trump     surprise
## 739            majority          joy
## 740            majority     positive
## 741            majority        trust
## 742              system        trust
## 743             hurting        anger
## 744             hurting         fear
## 745             hurting     negative
## 746             hurting      sadness
## 747          government         fear
## 748          government     negative
## 749             economy        trust
## 750              system        trust
## 751              united     positive
## 752              united        trust
## 753               money        anger
## 754               money anticipation
## 755               money          joy
## 756               money     positive
## 757               money     surprise
## 758               money        trust
## 759            politics        anger
## 760              stupid     negative
## 761               toxic      disgust
## 762               toxic     negative
## 763                cold     negative
## 764            terrible        anger
## 765            terrible      disgust
## 766            terrible         fear
## 767            terrible     negative
## 768            terrible      sadness
## 769               model     positive
## 770            politics        anger
## 771                pool     positive
## 772               trump     surprise
## 773               trump     surprise
## 774              agreed     positive
## 775              agreed        trust
## 776                cold     negative
## 777            terrible        anger
## 778            terrible      disgust
## 779            terrible         fear
## 780            terrible     negative
## 781            terrible      sadness
## 782               model     positive
## 783            politics        anger
## 784                pool     positive
## 785              agreed     positive
## 786              agreed        trust
## 787              change         fear
## 788            horrific        anger
## 789            horrific      disgust
## 790            horrific         fear
## 791            horrific     negative
## 792            horrific      sadness
## 793                time anticipation
## 794          government         fear
## 795          government     negative
## 796         progressive     positive
## 797           candidate     positive
## 798             healthy     positive
## 799              remove        anger
## 800              remove         fear
## 801              remove     negative
## 802              remove      sadness
## 803                cold     negative
## 804               money        anger
## 805               money anticipation
## 806               money          joy
## 807               money     positive
## 808               money     surprise
## 809               money        trust
## 810            balanced     positive
## 811            majority          joy
## 812            majority     positive
## 813            majority        trust
## 814                rest     positive
## 815              drivel      disgust
## 816              drivel     negative
## 817                clue anticipation
## 818            collapse      disgust
## 819            collapse         fear
## 820            collapse     negative
## 821            collapse      sadness
## 822             blatant        anger
## 823             blatant      disgust
## 824             blatant     negative
## 825            terrible        anger
## 826            terrible      disgust
## 827            terrible         fear
## 828            terrible     negative
## 829            terrible      sadness
## 830       unsustainable     negative
## 831              system        trust
## 832              system        trust
## 833              change         fear
## 834                time anticipation
## 835          revolution        anger
## 836          revolution anticipation
## 837          revolution         fear
## 838          revolution     negative
## 839          revolution     positive
## 840          revolution      sadness
## 841          revolution     surprise
## 842             violent        anger
## 843             violent      disgust
## 844             violent         fear
## 845             violent     negative
## 846             violent     surprise
## 847            terrible        anger
## 848            terrible      disgust
## 849            terrible         fear
## 850            terrible     negative
## 851            terrible      sadness
## 852           guarantee     positive
## 853           guarantee        trust
## 854              system        trust
## 855              system        trust
## 856              system        trust
## 857               silly          joy
## 858               silly     negative
## 859               silly          joy
## 860               silly     negative
## 861              system        trust
## 862            collapse      disgust
## 863            collapse         fear
## 864            collapse     negative
## 865            collapse      sadness
## 866              system        trust
## 867                poll        trust
## 868            majority          joy
## 869            majority     positive
## 870            majority        trust
## 871          population     positive
## 872               agree     positive
## 873             partner     positive
## 874                plan anticipation
## 875                save          joy
## 876                save     positive
## 877                save        trust
## 878               money        anger
## 879               money anticipation
## 880               money          joy
## 881               money     positive
## 882               money     surprise
## 883               money        trust
## 884               green          joy
## 885               green     positive
## 886               green        trust
## 887             holiday anticipation
## 888             holiday          joy
## 889             holiday     positive
## 890               slump     negative
## 891               slump      sadness
## 892               alive anticipation
## 893               alive          joy
## 894               alive     positive
## 895               alive        trust
## 896             partner     positive
## 897                luck anticipation
## 898                luck          joy
## 899                luck     positive
## 900                luck     surprise
## 901               awful        anger
## 902               awful      disgust
## 903               awful         fear
## 904               awful     negative
## 905               awful      sadness
## 906             partner     positive
## 907                luck anticipation
## 908                luck          joy
## 909                luck     positive
## 910                luck     surprise
## 911              option     positive
## 912                hope anticipation
## 913                hope          joy
## 914                hope     positive
## 915                hope     surprise
## 916                hope        trust
## 917                luck anticipation
## 918                luck          joy
## 919                luck     positive
## 920                luck     surprise
## 921              agreed     positive
## 922              agreed        trust
## 923             hanging        anger
## 924             hanging      disgust
## 925             hanging         fear
## 926             hanging     negative
## 927             hanging      sadness
## 928                hope anticipation
## 929                hope          joy
## 930                hope     positive
## 931                hope     surprise
## 932                hope        trust
## 933              status     positive
## 934             protect     positive
## 935                 god anticipation
## 936                 god         fear
## 937                 god          joy
## 938                 god     positive
## 939                 god        trust
## 940                damn        anger
## 941                damn      disgust
## 942                damn     negative
## 943           difficult         fear
## 944               level     positive
## 945               level        trust
## 946          management     positive
## 947          management        trust
## 948              school        trust
## 949               spent     negative
## 950            pandemic         fear
## 951            pandemic     negative
## 952            pandemic      sadness
## 953                 job     positive
## 954             abysmal     negative
## 955             abysmal      sadness
## 956                 row        anger
## 957                 row     negative
## 958                food          joy
## 959                food     positive
## 960                food        trust
## 961                time anticipation
## 962                 hot        anger
## 963                time anticipation
## 964                cash        anger
## 965                cash anticipation
## 966                cash         fear
## 967                cash          joy
## 968                cash     positive
## 969                cash        trust
## 970          assistance     positive
## 971                lost     negative
## 972                lost      sadness
## 973           exhausted     negative
## 974           exhausted      sadness
## 975                pain         fear
## 976                pain     negative
## 977                pain      sadness
## 978               broke         fear
## 979               broke     negative
## 980               broke      sadness
## 981           insidious        anger
## 982           insidious      disgust
## 983           insidious         fear
## 984           insidious     negative
## 985                dare anticipation
## 986                dare        trust
## 987              expect anticipation
## 988              expect     positive
## 989              expect     surprise
## 990              expect        trust
## 991                 pay anticipation
## 992                 pay          joy
## 993                 pay     positive
## 994                 pay        trust
## 995              school        trust
## 996               offer     positive
## 997             minimum     negative
## 998               level     positive
## 999               level        trust
## 1000          insulting        anger
## 1001          insulting      disgust
## 1002          insulting         fear
## 1003          insulting     negative
## 1004          insulting      sadness
## 1005               time anticipation
## 1006               rest     positive
## 1007               shit        anger
## 1008               shit      disgust
## 1009               shit     negative
## 1010           beholden     negative
## 1011         population     positive
## 1012           ignorant      disgust
## 1013           ignorant     negative
## 1014            prevent         fear
## 1015          disregard     negative
## 1016          suffering      disgust
## 1017          suffering         fear
## 1018          suffering     negative
## 1019          suffering      sadness
## 1020             flying         fear
## 1021             flying     positive
## 1022              start anticipation
## 1023               acid     negative
## 1024             prison        anger
## 1025             prison         fear
## 1026             prison     negative
## 1027             prison      sadness
## 1028      revolutionary     positive
## 1029      revolutionary     positive
## 1030           crippled     negative
## 1031           crippled      sadness
## 1032             damage        anger
## 1033             damage      disgust
## 1034             damage     negative
## 1035             damage      sadness
## 1036         completely     positive
## 1037                ill        anger
## 1038                ill      disgust
## 1039                ill         fear
## 1040                ill     negative
## 1041                ill      sadness
## 1042            falling     negative
## 1043            falling      sadness
## 1044           avoiding         fear
## 1045              march     positive
## 1046         unemployed         fear
## 1047         unemployed     negative
## 1048         unemployed      sadness
## 1049          community     positive
## 1050             crisis     negative
## 1051          counselor     positive
## 1052          counselor        trust
## 1053           homeless        anger
## 1054           homeless anticipation
## 1055           homeless      disgust
## 1056           homeless         fear
## 1057           homeless     negative
## 1058           homeless      sadness
## 1059               kill         fear
## 1060               kill     negative
## 1061               kill      sadness
## 1062            suicide        anger
## 1063            suicide         fear
## 1064            suicide     negative
## 1065            suicide      sadness
## 1066           homeless        anger
## 1067           homeless anticipation
## 1068           homeless      disgust
## 1069           homeless         fear
## 1070           homeless     negative
## 1071           homeless      sadness
## 1072               kill         fear
## 1073               kill     negative
## 1074               kill      sadness
## 1075             option     positive
## 1076          salvation anticipation
## 1077          salvation          joy
## 1078          salvation     positive
## 1079          salvation        trust
## 1080                beg     negative
## 1081                beg      sadness
## 1082             escape anticipation
## 1083             escape         fear
## 1084             escape     negative
## 1085             escape     positive
## 1086               hell        anger
## 1087               hell      disgust
## 1088               hell         fear
## 1089               hell     negative
## 1090               hell      sadness
## 1091              death        anger
## 1092              death anticipation
## 1093              death      disgust
## 1094              death         fear
## 1095              death     negative
## 1096              death      sadness
## 1097              death     surprise
## 1098              abuse        anger
## 1099              abuse      disgust
## 1100              abuse         fear
## 1101              abuse     negative
## 1102              abuse      sadness
## 1103              worth     positive
## 1104               pain         fear
## 1105               pain     negative
## 1106               pain      sadness
## 1107              worth     positive
## 1108           isolated         fear
## 1109           isolated     negative
## 1110           isolated      sadness
## 1111             apathy     negative
## 1112             apathy      sadness
## 1113          rebellion        anger
## 1114          rebellion      disgust
## 1115          rebellion         fear
## 1116                die         fear
## 1117                die     negative
## 1118                die      sadness
## 1119            suicide        anger
## 1120            suicide         fear
## 1121            suicide     negative
## 1122            suicide      sadness
## 1123            freedom          joy
## 1124            freedom     positive
## 1125            freedom        trust
## 1126              worth     positive
## 1127         government         fear
## 1128         government     negative
## 1129               kill         fear
## 1130               kill     negative
## 1131               kill      sadness
## 1132               love          joy
## 1133               love     positive
## 1134            maximum     positive
## 1135            feeling        anger
## 1136            feeling anticipation
## 1137            feeling      disgust
## 1138            feeling         fear
## 1139            feeling          joy
## 1140            feeling     negative
## 1141            feeling     positive
## 1142            feeling      sadness
## 1143            feeling     surprise
## 1144            feeling        trust
## 1145           defeated     negative
## 1146           defeated      sadness
## 1147             writer     positive
## 1148               flea      disgust
## 1149               flea     negative
## 1150              guess     surprise
## 1151               food          joy
## 1152               food     positive
## 1153               food        trust
## 1154              guess     surprise
## 1155               food          joy
## 1156               food     positive
## 1157               food        trust
## 1158         disability     negative
## 1159         disability      sadness
## 1160         disability     negative
## 1161         disability      sadness
## 1162             lawyer        anger
## 1163             lawyer      disgust
## 1164             lawyer         fear
## 1165             lawyer     negative
## 1166        correctness        trust
## 1167           eventual anticipation
## 1168             appeal anticipation
## 1169         disability     negative
## 1170         disability      sadness
## 1171             lawyer        anger
## 1172             lawyer      disgust
## 1173             lawyer         fear
## 1174             lawyer     negative
## 1175              award anticipation
## 1176              award          joy
## 1177              award     positive
## 1178              award     surprise
## 1179              award        trust
## 1180              fixed        trust
## 1181            maximum     positive
## 1182         disability     negative
## 1183         disability      sadness
## 1184               time anticipation
## 1185            refused     negative
## 1186            refused      sadness
## 1187              fight        anger
## 1188              fight         fear
## 1189              fight     negative
## 1190            medical anticipation
## 1191            medical         fear
## 1192            medical     positive
## 1193            medical        trust
## 1194         disability     negative
## 1195         disability      sadness
## 1196           disabled         fear
## 1197           disabled     negative
## 1198           disabled      sadness
## 1199                pay anticipation
## 1200                pay          joy
## 1201                pay     positive
## 1202                pay        trust
## 1203               kill         fear
## 1204               kill     negative
## 1205               kill      sadness
## 1206             suffer     negative
## 1207              legal     positive
## 1208              legal        trust
## 1209     discrimination        anger
## 1210     discrimination      disgust
## 1211     discrimination         fear
## 1212     discrimination     negative
## 1213     discrimination      sadness
## 1214            ability     positive
## 1215              money        anger
## 1216              money anticipation
## 1217              money          joy
## 1218              money     positive
## 1219              money     surprise
## 1220              money        trust
## 1221               food          joy
## 1222               food     positive
## 1223               food        trust
## 1224             battle        anger
## 1225             battle     negative
## 1226         government         fear
## 1227         government     negative
## 1228         disability     negative
## 1229         disability      sadness
## 1230             stress     negative
## 1231               safe          joy
## 1232               safe     positive
## 1233               safe        trust
## 1234             mentor     positive
## 1235             mentor        trust
## 1236              guide     positive
## 1237              guide        trust
## 1238              money        anger
## 1239              money anticipation
## 1240              money          joy
## 1241              money     positive
## 1242              money     surprise
## 1243              money        trust
## 1244             income anticipation
## 1245             income          joy
## 1246             income     negative
## 1247             income     positive
## 1248             income      sadness
## 1249             income        trust
## 1250              spite        anger
## 1251              spite     negative
## 1252                joy          joy
## 1253                joy     positive
## 1254            bastard      disgust
## 1255            bastard     negative
## 1256            bastard      sadness
## 1257            deserve        anger
## 1258            deserve anticipation
## 1259            deserve     positive
## 1260            deserve        trust
## 1261                eat     positive
## 1262              trash      disgust
## 1263              trash     negative
## 1264              trash      sadness
## 1265            worried     negative
## 1266            worried      sadness
## 1267            sheriff        trust
## 1268              dying        anger
## 1269              dying      disgust
## 1270              dying         fear
## 1271              dying     negative
## 1272              dying      sadness
## 1273           homeless        anger
## 1274           homeless anticipation
## 1275           homeless      disgust
## 1276           homeless         fear
## 1277           homeless     negative
## 1278           homeless      sadness
## 1279            benefit     positive
## 1280              start anticipation
## 1281           homeless        anger
## 1282           homeless anticipation
## 1283           homeless      disgust
## 1284           homeless         fear
## 1285           homeless     negative
## 1286           homeless      sadness
## 1287          suffering      disgust
## 1288          suffering         fear
## 1289          suffering     negative
## 1290          suffering      sadness
## 1291            ongoing anticipation
## 1292              abuse        anger
## 1293              abuse      disgust
## 1294              abuse         fear
## 1295              abuse     negative
## 1296              abuse      sadness
## 1297                ill        anger
## 1298                ill      disgust
## 1299                ill         fear
## 1300                ill     negative
## 1301                ill      sadness
## 1302             refine     positive
## 1303              learn     positive
## 1304               grow anticipation
## 1305               grow          joy
## 1306               grow     positive
## 1307               grow        trust
## 1308             prison        anger
## 1309             prison         fear
## 1310             prison     negative
## 1311             prison      sadness
## 1312                sex anticipation
## 1313                sex          joy
## 1314                sex     positive
## 1315                sex        trust
## 1316              broke         fear
## 1317              broke     negative
## 1318              broke      sadness
## 1319            freedom          joy
## 1320            freedom     positive
## 1321            freedom        trust
## 1322              money        anger
## 1323              money anticipation
## 1324              money          joy
## 1325              money     positive
## 1326              money     surprise
## 1327              money        trust
## 1328            special          joy
## 1329            special     positive
## 1330           pressure     negative
## 1331               pull     positive
## 1332              watch anticipation
## 1333              watch         fear
## 1334                bad        anger
## 1335                bad      disgust
## 1336                bad         fear
## 1337                bad     negative
## 1338                bad      sadness
## 1339              wound        anger
## 1340              wound         fear
## 1341              wound     negative
## 1342              wound      sadness
## 1343              learn     positive
## 1344             series        trust
## 1345             chance     surprise
## 1346      entertainment anticipation
## 1347      entertainment          joy
## 1348      entertainment     positive
## 1349      entertainment     surprise
## 1350      entertainment        trust
## 1351              faith anticipation
## 1352              faith          joy
## 1353              faith     positive
## 1354              faith        trust
## 1355          socialism      disgust
## 1356          socialism         fear
## 1357              legal     positive
## 1358              legal        trust
## 1359       discriminate        anger
## 1360       discriminate     negative
## 1361       discriminate      sadness
## 1362           defeated     negative
## 1363           defeated      sadness
## 1364             afraid         fear
## 1365             afraid     negative
## 1366             doctor     positive
## 1367             doctor        trust
## 1368              worth     positive
## 1369               shot        anger
## 1370               shot         fear
## 1371               shot     negative
## 1372               shot      sadness
## 1373               shot     surprise
## 1374             system        trust
## 1375            justice     positive
## 1376            justice        trust
## 1377             happen anticipation
## 1378               hope anticipation
## 1379               hope          joy
## 1380               hope     positive
## 1381               hope     surprise
## 1382               hope        trust
## 1383            justice     positive
## 1384            justice        trust
## 1385             system        trust
## 1386              start anticipation
## 1387               vote        anger
## 1388               vote anticipation
## 1389               vote          joy
## 1390               vote     negative
## 1391               vote     positive
## 1392               vote      sadness
## 1393               vote     surprise
## 1394               vote        trust
## 1395               fair     positive
## 1396               kill         fear
## 1397               kill     negative
## 1398               kill      sadness
## 1399              start anticipation
## 1400             change         fear
## 1401         revolution        anger
## 1402         revolution anticipation
## 1403         revolution         fear
## 1404         revolution     negative
## 1405         revolution     positive
## 1406         revolution      sadness
## 1407         revolution     surprise
## 1408               kill         fear
## 1409               kill     negative
## 1410               kill      sadness
## 1411                die         fear
## 1412                die     negative
## 1413                die      sadness
## 1414           fighting        anger
## 1415           fighting     negative
## 1416                die         fear
## 1417                die     negative
## 1418                die      sadness
## 1419           majority          joy
## 1420           majority     positive
## 1421           majority        trust
## 1422         revolution        anger
## 1423         revolution anticipation
## 1424         revolution         fear
## 1425         revolution     negative
## 1426         revolution     positive
## 1427         revolution      sadness
## 1428         revolution     surprise
## 1429         revolution        anger
## 1430         revolution anticipation
## 1431         revolution         fear
## 1432         revolution     negative
## 1433         revolution     positive
## 1434         revolution      sadness
## 1435         revolution     surprise
## 1436            feeling        anger
## 1437            feeling anticipation
## 1438            feeling      disgust
## 1439            feeling         fear
## 1440            feeling          joy
## 1441            feeling     negative
## 1442            feeling     positive
## 1443            feeling      sadness
## 1444            feeling     surprise
## 1445            feeling        trust
## 1446               hope anticipation
## 1447               hope          joy
## 1448               hope     positive
## 1449               hope     surprise
## 1450               hope        trust
## 1451               vote        anger
## 1452               vote anticipation
## 1453               vote          joy
## 1454               vote     negative
## 1455               vote     positive
## 1456               vote      sadness
## 1457               vote     surprise
## 1458               vote        trust
## 1459              blame        anger
## 1460              blame      disgust
## 1461              blame     negative
## 1462           solution     positive
## 1463              ready anticipation
## 1464               save          joy
## 1465               save     positive
## 1466               save        trust
## 1467              money        anger
## 1468              money anticipation
## 1469              money          joy
## 1470              money     positive
## 1471              money     surprise
## 1472              money        trust
## 1473              start anticipation
## 1474              leave     negative
## 1475              leave      sadness
## 1476              leave     surprise
## 1477                ass     negative
## 1478          backwards      disgust
## 1479          backwards     negative
## 1480              happy anticipation
## 1481              happy          joy
## 1482              happy     positive
## 1483              happy        trust
## 1484                die         fear
## 1485                die     negative
## 1486                die      sadness
## 1487            supreme     positive
## 1488              court        anger
## 1489              court anticipation
## 1490              court         fear
## 1491               kick        anger
## 1492               kick     negative
## 1493             stroke         fear
## 1494             stroke     negative
## 1495             stroke      sadness
## 1496             attack        anger
## 1497             attack         fear
## 1498             attack     negative
## 1499              track anticipation
## 1500             friend          joy
## 1501             friend     positive
## 1502             friend        trust
## 1503             church anticipation
## 1504             church          joy
## 1505             church     positive
## 1506             church        trust
## 1507               wait anticipation
## 1508               wait     negative
## 1509              start anticipation
## 1510              dying        anger
## 1511              dying      disgust
## 1512              dying         fear
## 1513              dying     negative
## 1514              dying      sadness
## 1515               vote        anger
## 1516               vote anticipation
## 1517               vote          joy
## 1518               vote     negative
## 1519               vote     positive
## 1520               vote      sadness
## 1521               vote     surprise
## 1522               vote        trust
## 1523              marry anticipation
## 1524              marry         fear
## 1525              marry          joy
## 1526              marry     positive
## 1527              marry     surprise
## 1528              marry        trust
## 1529              dying        anger
## 1530              dying      disgust
## 1531              dying         fear
## 1532              dying     negative
## 1533              dying      sadness
## 1534             threat        anger
## 1535             threat         fear
## 1536             threat     negative
## 1537               blue      sadness
## 1538              watch anticipation
## 1539              watch         fear
## 1540              trump     surprise
## 1541              march     positive
## 1542              crazy        anger
## 1543              crazy         fear
## 1544              crazy     negative
## 1545              crazy      sadness
## 1546              marry anticipation
## 1547              marry         fear
## 1548              marry          joy
## 1549              marry     positive
## 1550              marry     surprise
## 1551              marry        trust
## 1552              wrong     negative
## 1553              civil     positive
## 1554            ongoing anticipation
## 1555             battle        anger
## 1556             battle     negative
## 1557           hopeless         fear
## 1558           hopeless     negative
## 1559           hopeless      sadness
## 1560           helpless         fear
## 1561           helpless     negative
## 1562           helpless      sadness
## 1563             change         fear
## 1564           princess     positive
## 1565               wear     negative
## 1566               wear        trust
## 1567               fire         fear
## 1568           progress anticipation
## 1569           progress          joy
## 1570           progress     positive
## 1571             stupid     negative
## 1572             warned anticipation
## 1573             warned         fear
## 1574             warned     surprise
## 1575             system        trust
## 1576             change         fear
## 1577                top anticipation
## 1578                top     positive
## 1579                top        trust
## 1580           defeated     negative
## 1581           defeated      sadness
## 1582               luck anticipation
## 1583               luck          joy
## 1584               luck     positive
## 1585               luck     surprise
## 1586             relief     positive
## 1587             relief     positive
## 1588            economy        trust
## 1589            balance     positive
## 1590              money        anger
## 1591              money anticipation
## 1592              money          joy
## 1593              money     positive
## 1594              money     surprise
## 1595              money        trust
## 1596              money        anger
## 1597              money anticipation
## 1598              money          joy
## 1599              money     positive
## 1600              money     surprise
## 1601              money        trust
## 1602              angry        anger
## 1603              angry      disgust
## 1604              angry     negative
## 1605           defeated     negative
## 1606           defeated      sadness
## 1607            slavery        anger
## 1608            slavery      disgust
## 1609            slavery         fear
## 1610            slavery     negative
## 1611            slavery      sadness
## 1612              fight        anger
## 1613              fight         fear
## 1614              fight     negative
## 1615             crying     negative
## 1616             crying      sadness
## 1617               pick     positive
## 1618               vice     negative
## 1619              enjoy anticipation
## 1620              enjoy          joy
## 1621              enjoy     positive
## 1622              enjoy        trust
## 1623                bad        anger
## 1624                bad      disgust
## 1625                bad         fear
## 1626                bad     negative
## 1627                bad      sadness
## 1628              worse         fear
## 1629              worse     negative
## 1630              worse      sadness
## 1631                bad        anger
## 1632                bad      disgust
## 1633                bad         fear
## 1634                bad     negative
## 1635                bad      sadness
## 1636                bad        anger
## 1637                bad      disgust
## 1638                bad         fear
## 1639                bad     negative
## 1640                bad      sadness
## 1641              enjoy anticipation
## 1642              enjoy          joy
## 1643              enjoy     positive
## 1644              enjoy        trust
## 1645            hurting        anger
## 1646            hurting         fear
## 1647            hurting     negative
## 1648            hurting      sadness
## 1649             cancel     negative
## 1650             cancel      sadness
## 1651               debt     negative
## 1652               debt      sadness
## 1653               debt     negative
## 1654               debt      sadness
## 1655         government         fear
## 1656         government     negative
## 1657                tax     negative
## 1658                tax      sadness
## 1659              money        anger
## 1660              money anticipation
## 1661              money          joy
## 1662              money     positive
## 1663              money     surprise
## 1664              money        trust
## 1665             pretty anticipation
## 1666             pretty          joy
## 1667             pretty     positive
## 1668             pretty        trust
## 1669              money        anger
## 1670              money anticipation
## 1671              money          joy
## 1672              money     positive
## 1673              money     surprise
## 1674              money        trust
## 1675           military         fear
## 1676            medical anticipation
## 1677            medical         fear
## 1678            medical     positive
## 1679            medical        trust
## 1680               debt     negative
## 1681               debt      sadness
## 1682               love          joy
## 1683               love     positive
## 1684           defeated     negative
## 1685           defeated      sadness
## 1686               time anticipation
## 1687         revolution        anger
## 1688         revolution anticipation
## 1689         revolution         fear
## 1690         revolution     negative
## 1691         revolution     positive
## 1692         revolution      sadness
## 1693         revolution     surprise
## 1694           complain        anger
## 1695           complain     negative
## 1696           complain      sadness
## 1697              leave     negative
## 1698              leave      sadness
## 1699              leave     surprise
## 1700         sacrifices      disgust
## 1701         sacrifices         fear
## 1702         sacrifices     negative
## 1703         sacrifices      sadness
## 1704               save          joy
## 1705               save     positive
## 1706               save        trust
## 1707            slavery        anger
## 1708            slavery      disgust
## 1709            slavery         fear
## 1710            slavery     negative
## 1711            slavery      sadness
## 1712             change         fear
## 1713          surprised     surprise
## 1714                die         fear
## 1715                die     negative
## 1716                die      sadness
## 1717            supreme     positive
## 1718              court        anger
## 1719              court anticipation
## 1720              court         fear
## 1721      consciousness     positive
## 1722             stupid     negative
## 1723            selfish        anger
## 1724            selfish      disgust
## 1725            selfish     negative
## 1726               debt     negative
## 1727               debt      sadness
## 1728             relief     positive
## 1729                top anticipation
## 1730                top     positive
## 1731                top        trust
## 1732             bottom     negative
## 1733             bottom      sadness
## 1734             bottom     negative
## 1735             bottom      sadness
## 1736           fighting        anger
## 1737           fighting     negative
## 1738                top anticipation
## 1739                top     positive
## 1740                top        trust
## 1741              enemy        anger
## 1742              enemy      disgust
## 1743              enemy         fear
## 1744              enemy     negative
## 1745               hate        anger
## 1746               hate      disgust
## 1747               hate         fear
## 1748               hate     negative
## 1749               hate      sadness
## 1750                pay anticipation
## 1751                pay          joy
## 1752                pay     positive
## 1753                pay        trust
## 1754              money        anger
## 1755              money anticipation
## 1756              money          joy
## 1757              money     positive
## 1758              money     surprise
## 1759              money        trust
## 1760               cold     negative
## 1761       continuation anticipation
## 1762           epidemic        anger
## 1763           epidemic anticipation
## 1764           epidemic      disgust
## 1765           epidemic         fear
## 1766           epidemic     negative
## 1767           epidemic      sadness
## 1768           epidemic     surprise
## 1769              serve     negative
## 1770              serve        trust
## 1771               risk anticipation
## 1772               risk         fear
## 1773               risk     negative
## 1774                pay anticipation
## 1775                pay          joy
## 1776                pay     positive
## 1777                pay        trust
## 1778             result anticipation
## 1779      unpredictable     negative
## 1780      unpredictable     surprise
## 1781            illness         fear
## 1782            illness     negative
## 1783            illness      sadness
## 1784          recession        anger
## 1785          recession      disgust
## 1786          recession         fear
## 1787          recession     negative
## 1788          recession      sadness
## 1789            knowing     positive
## 1790           building     positive
## 1791            poverty        anger
## 1792            poverty      disgust
## 1793            poverty         fear
## 1794            poverty     negative
## 1795            poverty      sadness
## 1796            replete     positive
## 1797         population     positive
## 1798               debt     negative
## 1799               debt      sadness
## 1800             strike        anger
## 1801             strike     negative
## 1802               join     positive
## 1803         solidarity        trust
## 1804          rebellion        anger
## 1805          rebellion      disgust
## 1806          rebellion         fear
## 1807             system        trust
## 1808          suffering      disgust
## 1809          suffering         fear
## 1810          suffering     negative
## 1811          suffering      sadness
## 1812           hopeless         fear
## 1813           hopeless     negative
## 1814           hopeless      sadness
## 1815             honest        anger
## 1816             honest      disgust
## 1817             honest         fear
## 1818             honest          joy
## 1819             honest     positive
## 1820             honest      sadness
## 1821             honest        trust
## 1822               dumb     negative
## 1823               debt     negative
## 1824               debt      sadness
## 1825          forgiving     positive
## 1826          forgiving        trust
## 1827               debt     negative
## 1828               debt      sadness
## 1829                beg     negative
## 1830                beg      sadness
## 1831             system        trust
## 1832           solution     positive
## 1833              happy anticipation
## 1834              happy          joy
## 1835              happy     positive
## 1836              happy        trust
## 1837          principal     positive
## 1838          principal        trust
## 1839               plan anticipation
## 1840             theory anticipation
## 1841             theory        trust
## 1842           gigantic     positive
## 1843             school        trust
## 1844               hell        anger
## 1845               hell      disgust
## 1846               hell         fear
## 1847               hell     negative
## 1848               hell      sadness
## 1849              silly          joy
## 1850              silly     negative
## 1851              start anticipation
## 1852             action     positive
## 1853             change         fear
## 1854              money        anger
## 1855              money anticipation
## 1856              money          joy
## 1857              money     positive
## 1858              money     surprise
## 1859              money        trust
## 1860              money        anger
## 1861              money anticipation
## 1862              money          joy
## 1863              money     positive
## 1864              money     surprise
## 1865              money        trust
## 1866            deserve        anger
## 1867            deserve anticipation
## 1868            deserve     positive
## 1869            deserve        trust
## 1870              abuse        anger
## 1871              abuse      disgust
## 1872              abuse         fear
## 1873              abuse     negative
## 1874              abuse      sadness
## 1875               vote        anger
## 1876               vote anticipation
## 1877               vote          joy
## 1878               vote     negative
## 1879               vote     positive
## 1880               vote      sadness
## 1881               vote     surprise
## 1882               vote        trust
## 1883               blue      sadness
## 1884              shame      disgust
## 1885              shame         fear
## 1886              shame     negative
## 1887              shame      sadness
## 1888     constitutional     positive
## 1889     constitutional        trust
## 1890             damage        anger
## 1891             damage      disgust
## 1892             damage     negative
## 1893             damage      sadness
## 1894              trump     surprise
## 1895           majority          joy
## 1896           majority     positive
## 1897           majority        trust
## 1898               vote        anger
## 1899               vote anticipation
## 1900               vote          joy
## 1901               vote     negative
## 1902               vote     positive
## 1903               vote      sadness
## 1904               vote     surprise
## 1905               vote        trust
## 1906             damage        anger
## 1907             damage      disgust
## 1908             damage     negative
## 1909             damage      sadness
## 1910             choice     positive
## 1911              trump     surprise
## 1912         xenophobia         fear
## 1913         xenophobia     negative
## 1914             status     positive
## 1915           soulless      disgust
## 1916           soulless         fear
## 1917           soulless     negative
## 1918           soulless      sadness
## 1919             damage        anger
## 1920             damage      disgust
## 1921             damage     negative
## 1922             damage      sadness
## 1923       intellectual     positive
## 1924              trump     surprise
## 1925             damage        anger
## 1926             damage      disgust
## 1927             damage     negative
## 1928             damage      sadness
## 1929           believed        trust
## 1930              trump     surprise
## 1931                mad        anger
## 1932                mad      disgust
## 1933                mad         fear
## 1934                mad     negative
## 1935                mad      sadness
## 1936             forced         fear
## 1937             forced     negative
## 1938             choice     positive
## 1939           majority          joy
## 1940           majority     positive
## 1941           majority        trust
## 1942               vote        anger
## 1943               vote anticipation
## 1944               vote          joy
## 1945               vote     negative
## 1946               vote     positive
## 1947               vote      sadness
## 1948               vote     surprise
## 1949               vote        trust
## 1950              crazy        anger
## 1951              crazy         fear
## 1952              crazy     negative
## 1953              crazy      sadness
## 1954          convinced        trust
## 1955              trump     surprise
## 1956         passionate anticipation
## 1957         passionate          joy
## 1958         passionate     positive
## 1959         passionate        trust
## 1960             stolen        anger
## 1961             stolen     negative
## 1962         conspiracy         fear
## 1963          convinced        trust
## 1964              trump     surprise
## 1965          president     positive
## 1966          president        trust
## 1967             afford     positive
## 1968                job     positive
## 1969             defeat     negative
## 1970            failure      disgust
## 1971            failure         fear
## 1972            failure     negative
## 1973            failure      sadness
## 1974            padding     positive
## 1975          suffering      disgust
## 1976          suffering         fear
## 1977          suffering     negative
## 1978          suffering      sadness
## 1979              labor anticipation
## 1980              labor          joy
## 1981              labor     positive
## 1982              labor     surprise
## 1983              labor        trust
## 1984              break     surprise
## 1985              break     surprise
## 1986              start anticipation
## 1987               lost     negative
## 1988               lost      sadness
## 1989            failure      disgust
## 1990            failure         fear
## 1991            failure     negative
## 1992            failure      sadness
## 1993          emergency         fear
## 1994          emergency     negative
## 1995          emergency      sadness
## 1996          emergency     surprise
## 1997         production anticipation
## 1998         production     positive
## 1999         production anticipation
## 2000         production     positive
## 2001              clean          joy
## 2002              clean     positive
## 2003              clean        trust
## 2004              rapid     surprise
## 2005              pivot     positive
## 2006              pivot        trust
## 2007          emergency         fear
## 2008          emergency     negative
## 2009          emergency      sadness
## 2010          emergency     surprise
## 2011         production anticipation
## 2012         production     positive
## 2013         production anticipation
## 2014         production     positive
## 2015          dangerous         fear
## 2016          dangerous     negative
## 2017               real     positive
## 2018               real        trust
## 2019         cautiously         fear
## 2020         cautiously     positive
## 2021             reform     positive
## 2022        immediately anticipation
## 2023        immediately     negative
## 2024        immediately     positive
## 2025         depressing      disgust
## 2026         depressing     negative
## 2027         depressing      sadness
## 2028               lose        anger
## 2029               lose      disgust
## 2030               lose         fear
## 2031               lose     negative
## 2032               lose      sadness
## 2033               lose     surprise
## 2034                die         fear
## 2035                die     negative
## 2036                die      sadness
## 2037            extinct     negative
## 2038            extinct      sadness
## 2039             manage     positive
## 2040             manage        trust
## 2041         completely     positive
## 2042           favorite          joy
## 2043           favorite     positive
## 2044           favorite        trust
## 2045                sun anticipation
## 2046                sun          joy
## 2047                sun     positive
## 2048                sun     surprise
## 2049                sun        trust
## 2050                sun anticipation
## 2051                sun          joy
## 2052                sun     positive
## 2053                sun     surprise
## 2054                sun        trust
## 2055           pressure     negative
## 2056             rocket        anger
## 2057            exhaust     negative
## 2058               love          joy
## 2059               love     positive
## 2060               vote        anger
## 2061               vote anticipation
## 2062               vote          joy
## 2063               vote     negative
## 2064               vote     positive
## 2065               vote      sadness
## 2066               vote     surprise
## 2067               vote        trust
## 2068            citizen     positive
## 2069               vote        anger
## 2070               vote anticipation
## 2071               vote          joy
## 2072               vote     negative
## 2073               vote     positive
## 2074               vote      sadness
## 2075               vote     surprise
## 2076               vote        trust
## 2077                don     positive
## 2078                don        trust
## 2079             luxury          joy
## 2080             luxury     positive
## 2081             choice     positive
## 2082               vote        anger
## 2083               vote anticipation
## 2084               vote          joy
## 2085               vote     negative
## 2086               vote     positive
## 2087               vote      sadness
## 2088               vote     surprise
## 2089               vote        trust
## 2090               time anticipation
## 2091         regulatory         fear
## 2092         regulatory     negative
## 2093            capture     negative
## 2094               love          joy
## 2095               love     positive
## 2096           distrust        anger
## 2097           distrust      disgust
## 2098           distrust         fear
## 2099           distrust     negative
## 2100               hate        anger
## 2101               hate      disgust
## 2102               hate         fear
## 2103               hate     negative
## 2104               hate      sadness
## 2105               hate        anger
## 2106               hate      disgust
## 2107               hate         fear
## 2108               hate     negative
## 2109               hate      sadness
## 2110               hate        anger
## 2111               hate      disgust
## 2112               hate         fear
## 2113               hate     negative
## 2114               hate      sadness
## 2115               evil        anger
## 2116               evil      disgust
## 2117               evil         fear
## 2118               evil     negative
## 2119               evil      sadness
## 2120                top anticipation
## 2121                top     positive
## 2122                top        trust
## 2123             bottom     negative
## 2124             bottom      sadness
## 2125               vote        anger
## 2126               vote anticipation
## 2127               vote          joy
## 2128               vote     negative
## 2129               vote     positive
## 2130               vote      sadness
## 2131               vote     surprise
## 2132               vote        trust
## 2133               love          joy
## 2134               love     positive
## 2135              agree     positive
## 2136               vote        anger
## 2137               vote anticipation
## 2138               vote          joy
## 2139               vote     negative
## 2140               vote     positive
## 2141               vote      sadness
## 2142               vote     surprise
## 2143               vote        trust
## 2144               vote        anger
## 2145               vote anticipation
## 2146               vote          joy
## 2147               vote     negative
## 2148               vote     positive
## 2149               vote      sadness
## 2150               vote     surprise
## 2151               vote        trust
## 2152             option     positive
## 2153               time anticipation
## 2154               shit        anger
## 2155               shit      disgust
## 2156               shit     negative
## 2157               talk     positive
## 2158               shit        anger
## 2159               shit      disgust
## 2160               shit     negative
## 2161            pretend     negative
## 2162              decry        anger
## 2163              decry     negative
## 2164               fair     positive
## 2165             change         fear
## 2166            killing        anger
## 2167            killing         fear
## 2168            killing     negative
## 2169            killing      sadness
## 2170              tired     negative
## 2171         pretending        anger
## 2172         pretending     negative
## 2173               undo     negative
## 2174              worse         fear
## 2175              worse     negative
## 2176              worse      sadness
## 2177              money        anger
## 2178              money anticipation
## 2179              money          joy
## 2180              money     positive
## 2181              money     surprise
## 2182              money        trust
## 2183               time anticipation
## 2184               sick      disgust
## 2185               sick     negative
## 2186               sick      sadness
## 2187               pick     positive
## 2188          anarchist        anger
## 2189          anarchist         fear
## 2190          anarchist     negative
## 2191            leaning        trust
## 2192          socialist        anger
## 2193          socialist      disgust
## 2194          socialist         fear
## 2195          socialist     negative
## 2196          socialist      sadness
## 2197            leaning        trust
## 2198           nonsense     negative
## 2199                don     positive
## 2200                don        trust
## 2201               shit        anger
## 2202               shit      disgust
## 2203               shit     negative
## 2204              wrong     negative
## 2205           disagree        anger
## 2206           disagree     negative
## 2207           continue anticipation
## 2208           continue     positive
## 2209           continue        trust
## 2210            ability     positive
## 2211             system        trust
## 2212          pointless     negative
## 2213          pointless      sadness
## 2214               vote        anger
## 2215               vote anticipation
## 2216               vote          joy
## 2217               vote     negative
## 2218               vote     positive
## 2219               vote      sadness
## 2220               vote     surprise
## 2221               vote        trust
## 2222            suggest        trust
## 2223               ripe     positive
## 2224              fight        anger
## 2225              fight         fear
## 2226              fight     negative
## 2227          defending     positive
## 2228        meaningless     negative
## 2229        meaningless      sadness
## 2230           solution     positive
## 2231            economy        trust
## 2232          dangerous         fear
## 2233          dangerous     negative
## 2234         pretending        anger
## 2235         pretending     negative
## 2236          dangerous         fear
## 2237          dangerous     negative
## 2238        complacency     positive
## 2239             crisis     negative
## 2240               vote        anger
## 2241               vote anticipation
## 2242               vote          joy
## 2243               vote     negative
## 2244               vote     positive
## 2245               vote      sadness
## 2246               vote     surprise
## 2247               vote        trust
## 2248           argument        anger
## 2249           argument     negative
## 2250               lost     negative
## 2251               lost      sadness
## 2252         production anticipation
## 2253         production     positive
## 2254             luxury          joy
## 2255             luxury     positive
## 2256              worse         fear
## 2257              worse     negative
## 2258              worse      sadness
## 2259             expect anticipation
## 2260             expect     positive
## 2261             expect     surprise
## 2262             expect        trust
## 2263               doom         fear
## 2264               doom     negative
## 2265             reason     positive
## 2266             change         fear
## 2267          emergency         fear
## 2268          emergency     negative
## 2269          emergency      sadness
## 2270          emergency     surprise
## 2271             action     positive
## 2272              moron     negative
## 2273              trump     surprise
## 2274            supreme     positive
## 2275              court        anger
## 2276              court anticipation
## 2277              court         fear
## 2278          emergency         fear
## 2279          emergency     negative
## 2280          emergency      sadness
## 2281          emergency     surprise
## 2282              build     positive
## 2283         assessment     surprise
## 2284         assessment        trust
## 2285             crisis     negative
## 2286             actual     positive
## 2287             threat        anger
## 2288             threat         fear
## 2289             threat     negative
## 2290              unity     positive
## 2291              unity        trust
## 2292         staggering     negative
## 2293               true          joy
## 2294               true     positive
## 2295               true        trust
## 2296          emergency         fear
## 2297          emergency     negative
## 2298          emergency      sadness
## 2299          emergency     surprise
## 2300            achieve          joy
## 2301            achieve     positive
## 2302            achieve        trust
## 2303              major     positive
## 2304               loss        anger
## 2305               loss         fear
## 2306               loss     negative
## 2307               loss      sadness
## 2308               true          joy
## 2309               true     positive
## 2310               true        trust
## 2311          emergency         fear
## 2312          emergency     negative
## 2313          emergency      sadness
## 2314          emergency     surprise
## 2315            achieve          joy
## 2316            achieve     positive
## 2317            achieve        trust
## 2318            suicide        anger
## 2319            suicide         fear
## 2320            suicide     negative
## 2321            suicide      sadness
## 2322             poorly     negative
## 2323               deal anticipation
## 2324               deal          joy
## 2325               deal     positive
## 2326               deal     surprise
## 2327               deal        trust
## 2328               time anticipation
## 2329               time anticipation
## 2330               hail     negative
## 2331               hail     positive
## 2332               hail        trust
## 2333             action     positive
## 2334             change         fear
## 2335             stupid     negative
## 2336             steady     surprise
## 2337             steady        trust
## 2338              blitz     surprise
## 2339         production anticipation
## 2340         production     positive
## 2341              lines         fear
## 2342                war         fear
## 2343                war     negative
## 2344                war         fear
## 2345                war     negative
## 2346             action     positive
## 2347              solid     positive
## 2348             senate        trust
## 2349         supporting     positive
## 2350         supporting        trust
## 2351          president     positive
## 2352          president        trust
## 2353            defense        anger
## 2354            defense anticipation
## 2355            defense         fear
## 2356            defense     positive
## 2357         production anticipation
## 2358         production     positive
## 2359              worth     positive
## 2360              daily anticipation
## 2361                fun anticipation
## 2362                fun          joy
## 2363                fun     positive
## 2364             agreed     positive
## 2365             agreed        trust
## 2366             demand        anger
## 2367             demand     negative
## 2368          emergency         fear
## 2369          emergency     negative
## 2370          emergency      sadness
## 2371          emergency     surprise
## 2372         production anticipation
## 2373         production     positive
## 2374            defense        anger
## 2375            defense anticipation
## 2376            defense         fear
## 2377            defense     positive
## 2378         production anticipation
## 2379         production     positive
## 2380             invoke anticipation
## 2381         accelerate anticipation
## 2382           disaster        anger
## 2383           disaster      disgust
## 2384           disaster         fear
## 2385           disaster     negative
## 2386           disaster      sadness
## 2387           disaster     surprise
## 2388            defense        anger
## 2389            defense anticipation
## 2390            defense         fear
## 2391            defense     positive
## 2392         production anticipation
## 2393         production     positive
## 2394          emergency         fear
## 2395          emergency     negative
## 2396          emergency      sadness
## 2397          emergency     surprise
## 2398         production anticipation
## 2399         production     positive
## 2400            defense        anger
## 2401            defense anticipation
## 2402            defense         fear
## 2403            defense     positive
## 2404         production anticipation
## 2405         production     positive
## 2406          president     positive
## 2407          president        trust
## 2408            defense        anger
## 2409            defense anticipation
## 2410            defense         fear
## 2411            defense     positive
## 2412         production anticipation
## 2413         production     positive
## 2414         accelerate anticipation
## 2415              clean          joy
## 2416              clean     positive
## 2417              clean        trust
## 2418             effort     positive
## 2419           disaster        anger
## 2420           disaster      disgust
## 2421           disaster         fear
## 2422           disaster     negative
## 2423           disaster      sadness
## 2424           disaster     surprise
## 2425                top anticipation
## 2426                top     positive
## 2427                top        trust
## 2428         production anticipation
## 2429         production     positive
## 2430         production anticipation
## 2431         production     positive
## 2432        commonplace anticipation
## 2433        commonplace        trust
## 2434                art anticipation
## 2435                art          joy
## 2436                art     positive
## 2437                art      sadness
## 2438                art     surprise
## 2439          withstand anticipation
## 2440          withstand         fear
## 2441          withstand     positive
## 2442              level     positive
## 2443              level        trust
## 2444          withstand anticipation
## 2445          withstand         fear
## 2446          withstand     positive
## 2447            drought     negative
## 2448        commonplace anticipation
## 2449        commonplace        trust
## 2450           reliable     positive
## 2451           reliable        trust
## 2452                ass     negative
## 2453             change         fear
## 2454            poverty        anger
## 2455            poverty      disgust
## 2456            poverty         fear
## 2457            poverty     negative
## 2458            poverty      sadness
## 2459          pollution      disgust
## 2460          pollution     negative
## 2461             change         fear
## 2462           planning anticipation
## 2463           planning     positive
## 2464           planning        trust
## 2465             happen anticipation
## 2466         completion anticipation
## 2467         completion          joy
## 2468         completion     positive
## 2469           disaster        anger
## 2470           disaster      disgust
## 2471           disaster         fear
## 2472           disaster     negative
## 2473           disaster      sadness
## 2474           disaster     surprise
## 2475           solution     positive
## 2476             actual     positive
## 2477           solution     positive
## 2478            blindly     negative
## 2479            blindly      sadness
## 2480         assessment     surprise
## 2481         assessment        trust
## 2482              spent     negative
## 2483           sabotage        anger
## 2484           sabotage      disgust
## 2485           sabotage         fear
## 2486           sabotage     negative
## 2487           sabotage      sadness
## 2488           sabotage     surprise
## 2489              store anticipation
## 2490              store     positive
## 2491              watch anticipation
## 2492              watch         fear
## 2493              laugh          joy
## 2494              laugh     positive
## 2495              laugh     surprise
## 2496                ass     negative
## 2497            cutting        anger
## 2498            cutting      disgust
## 2499            cutting         fear
## 2500            cutting     negative
## 2501            cutting      sadness
## 2502          gibberish        anger
## 2503          gibberish     negative
## 2504            wasting      disgust
## 2505            wasting         fear
## 2506            wasting     negative
## 2507            wasting      sadness
## 2508              money        anger
## 2509              money anticipation
## 2510              money          joy
## 2511              money     positive
## 2512              money     surprise
## 2513              money        trust
## 2514         assessment     surprise
## 2515         assessment        trust
## 2516                sun anticipation
## 2517                sun          joy
## 2518                sun     positive
## 2519                sun     surprise
## 2520                sun        trust
## 2521              shine     positive
## 2522            cutting        anger
## 2523            cutting      disgust
## 2524            cutting         fear
## 2525            cutting     negative
## 2526            cutting      sadness
## 2527           building     positive
## 2528               time anticipation
## 2529          gibberish        anger
## 2530          gibberish     negative
## 2531            wasting      disgust
## 2532            wasting         fear
## 2533            wasting     negative
## 2534            wasting      sadness
## 2535              money        anger
## 2536              money anticipation
## 2537              money          joy
## 2538              money     positive
## 2539              money     surprise
## 2540              money        trust
## 2541               duke     positive
## 2542               duke     positive
## 2543             county        trust
## 2544             stupid     negative
## 2545               wait anticipation
## 2546               wait     negative
## 2547             plunge         fear
## 2548             plunge     negative
## 2549           dinosaur         fear
## 2550                pay anticipation
## 2551                pay          joy
## 2552                pay     positive
## 2553                pay        trust
## 2554          attention     positive
## 2555              share anticipation
## 2556              share          joy
## 2557              share     positive
## 2558              share        trust
## 2559             change         fear
## 2560           dinosaur         fear
## 2561             option     positive
## 2562             change         fear
## 2563                pay anticipation
## 2564                pay          joy
## 2565                pay     positive
## 2566                pay        trust
## 2567          attention     positive
## 2568              guess     surprise
## 2569        electricity     positive
## 2570             demand        anger
## 2571             demand     negative
## 2572           constant     positive
## 2573           constant        trust
## 2574           solution     positive
## 2575           solution     positive
## 2576             coming anticipation
## 2577            minimum     negative
## 2578           electric          joy
## 2579           electric     positive
## 2580           electric     surprise
## 2581             demand        anger
## 2582             demand     negative
## 2583               time anticipation
## 2584             change         fear
## 2585             stupid     negative
## 2586             forget     negative
## 2587              build     positive
## 2588              giant         fear
## 2589              cover        trust
## 2590                sun anticipation
## 2591                sun          joy
## 2592                sun     positive
## 2593                sun     surprise
## 2594                sun        trust
## 2595                sun anticipation
## 2596                sun          joy
## 2597                sun     positive
## 2598                sun     surprise
## 2599                sun        trust
## 2600             theory anticipation
## 2601             theory        trust
## 2602             create          joy
## 2603             create     positive
## 2604                sun anticipation
## 2605                sun          joy
## 2606                sun     positive
## 2607                sun     surprise
## 2608                sun        trust
## 2609            sarcasm        anger
## 2610            sarcasm      disgust
## 2611            sarcasm     negative
## 2612            sarcasm      sadness
## 2613           inaction     negative
## 2614                sun anticipation
## 2615                sun          joy
## 2616                sun     positive
## 2617                sun     surprise
## 2618                sun        trust
## 2619            hurting        anger
## 2620            hurting         fear
## 2621            hurting     negative
## 2622            hurting      sadness
## 2623               time anticipation
## 2624                sun anticipation
## 2625                sun          joy
## 2626                sun     positive
## 2627                sun     surprise
## 2628                sun        trust
## 2629            leading        trust
## 2630         disastrous        anger
## 2631         disastrous         fear
## 2632         disastrous     negative
## 2633         disastrous      sadness
## 2634               plan anticipation
## 2635               love          joy
## 2636               love     positive
## 2637              money        anger
## 2638              money anticipation
## 2639              money          joy
## 2640              money     positive
## 2641              money     surprise
## 2642              money        trust
## 2643            chuckle anticipation
## 2644            chuckle          joy
## 2645            chuckle     positive
## 2646            chuckle     surprise
## 2647            chuckle        trust
## 2648             ignore     negative
## 2649            obvious     positive
## 2650            obvious        trust
## 2651             pretty anticipation
## 2652             pretty          joy
## 2653             pretty     positive
## 2654             pretty        trust
## 2655         convincing        trust
## 2656          arguments        anger
## 2657             happen anticipation
## 2658                don     positive
## 2659                don        trust
## 2660          injection         fear
## 2661               time anticipation
## 2662              happy anticipation
## 2663              happy          joy
## 2664              happy     positive
## 2665              happy        trust
## 2666               true          joy
## 2667               true     positive
## 2668               true        trust
## 2669            screwed        anger
## 2670            screwed     negative
## 2671               time anticipation
## 2672            delayed     negative
## 2673               hail     negative
## 2674               hail     positive
## 2675               hail        trust
## 2676               hope anticipation
## 2677               hope          joy
## 2678               hope     positive
## 2679               hope     surprise
## 2680               hope        trust
## 2681              sadly     negative
## 2682              sadly      sadness
## 2683             change         fear
## 2684              lower     negative
## 2685              lower      sadness
## 2686               time anticipation
## 2687               time anticipation
## 2688            neutral anticipation
## 2689            neutral        trust
## 2690               balk     negative
## 2691                sun anticipation
## 2692                sun          joy
## 2693                sun     positive
## 2694                sun     surprise
## 2695                sun        trust
## 2696           ultimate anticipation
## 2697           ultimate      sadness
## 2698        destruction        anger
## 2699        destruction     negative
## 2700           humanity          joy
## 2701           humanity     positive
## 2702           humanity        trust
## 2703             proven        trust
## 2704               time anticipation
## 2705             damage        anger
## 2706             damage      disgust
## 2707             damage     negative
## 2708             damage      sadness
## 2709                sun anticipation
## 2710                sun          joy
## 2711                sun     positive
## 2712                sun     surprise
## 2713                sun        trust
## 2714      unpredictable     negative
## 2715      unpredictable     surprise
## 2716            assured     positive
## 2717            assured        trust
## 2718        destruction        anger
## 2719        destruction     negative
## 2720            assured     positive
## 2721            assured        trust
## 2722           resident     positive
## 2723              fight        anger
## 2724              fight         fear
## 2725              fight     negative
## 2726         government         fear
## 2727         government     negative
## 2728               risk anticipation
## 2729               risk         fear
## 2730               risk     negative
## 2731         population     positive
## 2732         exhaustion anticipation
## 2733         exhaustion     negative
## 2734         exhaustion      sadness
## 2735               hope anticipation
## 2736               hope          joy
## 2737               hope     positive
## 2738               hope     surprise
## 2739               hope        trust
## 2740               talk     positive
## 2741              worry anticipation
## 2742              worry         fear
## 2743              worry     negative
## 2744              worry      sadness
## 2745           solution     positive
## 2746          pollution      disgust
## 2747          pollution     negative
## 2748          pollution      disgust
## 2749          pollution     negative
## 2750              force        anger
## 2751              force         fear
## 2752              force     negative
## 2753               core     positive
## 2754        possibility anticipation
## 2755             ignore     negative
## 2756                sun anticipation
## 2757                sun          joy
## 2758                sun     positive
## 2759                sun     surprise
## 2760                sun        trust
## 2761          convinced        trust
## 2762               veto        anger
## 2763               veto     negative
## 2764              scoff        anger
## 2765              scoff      disgust
## 2766              scoff     negative
## 2767               yell        anger
## 2768               yell         fear
## 2769               yell     negative
## 2770               yell     surprise
## 2771           advocate        trust
## 2772               blue      sadness
## 2773             scream        anger
## 2774             scream      disgust
## 2775             scream         fear
## 2776             scream     negative
## 2777             scream     surprise
## 2778               luck anticipation
## 2779               luck          joy
## 2780               luck     positive
## 2781               luck     surprise
## 2782            explain     positive
## 2783            explain        trust
## 2784             stupid     negative
## 2785             change         fear
## 2786              sadly     negative
## 2787              sadly      sadness
## 2788             option     positive
## 2789          radiation         fear
## 2790          radiation     negative
## 2791              agree     positive
## 2792              avoid         fear
## 2793              avoid     negative
## 2794       collectively     positive
## 2795       collectively        trust
## 2796          restraint     positive
## 2797             remove        anger
## 2798             remove         fear
## 2799             remove     negative
## 2800             remove      sadness
## 2801             stupid     negative
## 2802             proven        trust
## 2803             change         fear
## 2804                ban     negative
## 2805          essential     positive
## 2806                tax     negative
## 2807                tax      sadness
## 2808             wealth          joy
## 2809             wealth     positive
## 2810             wealth        trust
## 2811                ban     negative
## 2812        agriculture     positive
## 2813           question     positive
## 2814            survive     positive
## 2815               hate        anger
## 2816               hate      disgust
## 2817               hate         fear
## 2818               hate     negative
## 2819               hate      sadness
## 2820           increase     positive
## 2821                pay anticipation
## 2822                pay          joy
## 2823                pay     positive
## 2824                pay        trust
## 2825                sun anticipation
## 2826                sun          joy
## 2827                sun     positive
## 2828                sun     surprise
## 2829                sun        trust
## 2830              idiot      disgust
## 2831              idiot     negative
## 2832            economy        trust
## 2833               shit        anger
## 2834               shit      disgust
## 2835               shit     negative
## 2836              waste      disgust
## 2837              waste     negative
## 2838               word     positive
## 2839               word        trust
## 2840               word     positive
## 2841               word        trust
## 2842            unknown anticipation
## 2843            unknown         fear
## 2844            unknown     negative
## 2845                god anticipation
## 2846                god         fear
## 2847                god          joy
## 2848                god     positive
## 2849                god        trust
## 2850              study     positive
## 2851                sun anticipation
## 2852                sun          joy
## 2853                sun     positive
## 2854                sun     surprise
## 2855                sun        trust
## 2856               star anticipation
## 2857               star          joy
## 2858               star     positive
## 2859               star        trust
## 2860              guess     surprise
## 2861          recommend     positive
## 2862          recommend        trust
## 2863                sky     positive
## 2864           building     positive
## 2865             change         fear
## 2866             policy        trust
## 2867               wise     positive
## 2868       uncontrolled     negative
## 2869             expect anticipation
## 2870             expect     positive
## 2871             expect     surprise
## 2872             expect        trust
## 2873            balance     positive
## 2874            unknown anticipation
## 2875            unknown         fear
## 2876            unknown     negative
## 2877                sun anticipation
## 2878                sun          joy
## 2879                sun     positive
## 2880                sun     surprise
## 2881                sun        trust
## 2882                sun anticipation
## 2883                sun          joy
## 2884                sun     positive
## 2885                sun     surprise
## 2886                sun        trust
## 2887               holy     positive
## 2888             create          joy
## 2889             create     positive
## 2890           violence        anger
## 2891           violence         fear
## 2892           violence     negative
## 2893           violence      sadness
## 2894              moral        anger
## 2895              moral     positive
## 2896              moral        trust
## 2897           imminent anticipation
## 2898           imminent         fear
## 2899            defense        anger
## 2900            defense anticipation
## 2901            defense         fear
## 2902            defense     positive
## 2903           lobbyist     negative
## 2904               hell        anger
## 2905               hell      disgust
## 2906               hell         fear
## 2907               hell     negative
## 2908               hell      sadness
## 2909        unfortunate     negative
## 2910        unfortunate      sadness
## 2911            readily     positive
## 2912             happen anticipation
## 2913               love          joy
## 2914               love     positive
## 2915               hate        anger
## 2916               hate      disgust
## 2917               hate         fear
## 2918               hate     negative
## 2919               hate      sadness
## 2920           confront        anger
## 2921            leading        trust
## 2922              worth     positive
## 2923             giving     positive
## 2924             offset anticipation
## 2925             offset     positive
## 2926           inspired          joy
## 2927           inspired     positive
## 2928           inspired     surprise
## 2929           inspired        trust
## 2930               hero anticipation
## 2931               hero          joy
## 2932               hero     positive
## 2933               hero     surprise
## 2934               hero        trust
## 2935             change         fear
## 2936              money        anger
## 2937              money anticipation
## 2938              money          joy
## 2939              money     positive
## 2940              money     surprise
## 2941              money        trust
## 2942                pay anticipation
## 2943                pay          joy
## 2944                pay     positive
## 2945                pay        trust
## 2946              track anticipation
## 2947              money        anger
## 2948              money anticipation
## 2949              money          joy
## 2950              money     positive
## 2951              money     surprise
## 2952              money        trust
## 2953          candidate     positive
## 2954            forward     positive
## 2955            bribery      disgust
## 2956            bribery     negative
## 2957            primary     positive
## 2958           opponent        anger
## 2959           opponent anticipation
## 2960           opponent      disgust
## 2961           opponent         fear
## 2962           opponent     negative
## 2963              scare        anger
## 2964              scare anticipation
## 2965              scare         fear
## 2966              scare     negative
## 2967              scare     surprise
## 2968         uninformed     negative
## 2969                law        trust
## 2970               lose        anger
## 2971               lose      disgust
## 2972               lose         fear
## 2973               lose     negative
## 2974               lose      sadness
## 2975               lose     surprise
## 2976              puppy anticipation
## 2977              puppy     positive
## 2978              puppy        trust
## 2979               food          joy
## 2980               food     positive
## 2981               food        trust
## 2982           adorable          joy
## 2983           adorable     positive
## 2984              puppy anticipation
## 2985              puppy     positive
## 2986              puppy        trust
## 2987          candidate     positive
## 2988                law        trust
## 2989          candidate     positive
## 2990               hate        anger
## 2991               hate      disgust
## 2992               hate         fear
## 2993               hate     negative
## 2994               hate      sadness
## 2995        progressive     positive
## 2996          candidate     positive
## 2997          candidate     positive
## 2998           leverage     positive
## 2999             manage     positive
## 3000             manage        trust
## 3001             needle     positive
## 3002             manage     positive
## 3003             manage        trust
## 3004                job     positive
## 3005         depressing      disgust
## 3006         depressing     negative
## 3007         depressing      sadness
## 3008           absolute     positive
## 3009            captain     positive
## 3010           guardian     positive
## 3011           guardian        trust
## 3012              green          joy
## 3013              green     positive
## 3014              green        trust
## 3015            ancient     negative
## 3016       overwhelming     positive
## 3017         corrupting        anger
## 3018         corrupting      disgust
## 3019         corrupting         fear
## 3020         corrupting     negative
## 3021         corrupting      sadness
## 3022          influence     negative
## 3023          influence     positive
## 3024            outcome     positive
## 3025             system        trust
## 3026          democracy     positive
## 3027          democracy     positive
## 3028           assembly     positive
## 3029           assembly        trust
## 3030            citizen     positive
## 3031             chosen     positive
## 3032              serve     negative
## 3033              serve        trust
## 3034               jury        trust
## 3035           beholden     negative
## 3036          emergency         fear
## 3037          emergency     negative
## 3038          emergency      sadness
## 3039          emergency     surprise
## 3040         prevention anticipation
## 3041         prevention     positive
## 3042             system        trust
## 3043             wealth          joy
## 3044             wealth     positive
## 3045             wealth        trust
## 3046             senate        trust
## 3047              worse         fear
## 3048              worse     negative
## 3049              worse      sadness
## 3050               save          joy
## 3051               save     positive
## 3052               save        trust
## 3053            happily          joy
## 3054            happily     positive
## 3055             ignore     negative
## 3056               rest     positive
## 3057           building     positive
## 3058               fire         fear
## 3059        established          joy
## 3060        established     positive
## 3061             system        trust
## 3062           collapse      disgust
## 3063           collapse         fear
## 3064           collapse     negative
## 3065           collapse      sadness
## 3066             option     positive
## 3067            abolish        anger
## 3068            abolish     negative
## 3069          establish        trust
## 3070          democracy     positive
## 3071    straightforward     positive
## 3072    straightforward        trust
## 3073         revolution        anger
## 3074         revolution anticipation
## 3075         revolution         fear
## 3076         revolution     negative
## 3077         revolution     positive
## 3078         revolution      sadness
## 3079         revolution     surprise
## 3080           assembly     positive
## 3081           assembly        trust
## 3082            limited        anger
## 3083            limited     negative
## 3084            limited      sadness
## 3085               jury        trust
## 3086        immediately anticipation
## 3087        immediately     negative
## 3088        immediately     positive
## 3089           assembly     positive
## 3090           assembly        trust
## 3091              worth     positive
## 3092         population     positive
## 3093           minimize     negative
## 3094          influence     negative
## 3095          influence     positive
## 3096             system        trust
## 3097             public anticipation
## 3098             public     positive
## 3099           beholden     negative
## 3100             policy        trust
## 3101             public anticipation
## 3102             public     positive
## 3103          democracy     positive
## 3104             expert     positive
## 3105             expert        trust
## 3106           guidance     positive
## 3107           guidance        trust
## 3108         destroying        anger
## 3109         destroying         fear
## 3110         destroying     negative
## 3111         destroying      sadness
## 3112               time anticipation
## 3113              chaos        anger
## 3114              chaos         fear
## 3115              chaos     negative
## 3116              chaos      sadness
## 3117            failure      disgust
## 3118            failure         fear
## 3119            failure     negative
## 3120            failure      sadness
## 3121           suicidal        anger
## 3122           suicidal      disgust
## 3123           suicidal         fear
## 3124           suicidal     negative
## 3125           suicidal      sadness
## 3126          guarantee     positive
## 3127          guarantee        trust
## 3128         retirement anticipation
## 3129         retirement         fear
## 3130         retirement          joy
## 3131         retirement     negative
## 3132         retirement     positive
## 3133         retirement      sadness
## 3134         retirement        trust
## 3135            savings     positive
## 3136               plan anticipation
## 3137             budget        trust
## 3138         government         fear
## 3139         government     negative
## 3140          inability     negative
## 3141          inability      sadness
## 3142              money        anger
## 3143              money anticipation
## 3144              money          joy
## 3145              money     positive
## 3146              money     surprise
## 3147              money        trust
## 3148            abolish        anger
## 3149            abolish     negative
## 3150          establish        trust
## 3151          democracy     positive
## 3152          destroyed        anger
## 3153          destroyed         fear
## 3154          destroyed     negative
## 3155          destroyed      sadness
## 3156        possibility anticipation
## 3157           criminal        anger
## 3158           criminal      disgust
## 3159           criminal         fear
## 3160           criminal     negative
## 3161          stupidity     negative
## 3162           question     positive
## 3163               rest     positive
## 3164           progress anticipation
## 3165           progress          joy
## 3166           progress     positive
## 3167              proud anticipation
## 3168              proud          joy
## 3169              proud     positive
## 3170              proud        trust
## 3171           official        trust
## 3172        partnership     positive
## 3173        partnership        trust
## 3174            discord        anger
## 3175            discord      disgust
## 3176            discord     negative
## 3177               join     positive
## 3178             action     positive
## 3179            contact     positive
## 3180                don     positive
## 3181                don        trust
## 3182            enslave     negative
## 3183              build     positive
## 3184               epic     positive
## 3185           electric          joy
## 3186           electric     positive
## 3187           electric     surprise
## 3188               rail        anger
## 3189               rail anticipation
## 3190               rail     negative
## 3191              build     positive
## 3192               epic     positive
## 3193             pickle     negative
## 3194             rocket        anger
## 3195               save          joy
## 3196               save     positive
## 3197               save        trust
## 3198            perfect anticipation
## 3199            perfect          joy
## 3200            perfect     positive
## 3201            perfect        trust
## 3202            mocking        anger
## 3203            mocking      disgust
## 3204            mocking     negative
## 3205            mocking      sadness
## 3206         intonation     positive
## 3207                die         fear
## 3208                die     negative
## 3209                die      sadness
## 3210              hardy          joy
## 3211              hardy     positive
## 3212              hardy        trust
## 3213                fun anticipation
## 3214                fun          joy
## 3215                fun     positive
## 3216              radar        trust
## 3217             system        trust
## 3218            crystal     positive
## 3219                don     positive
## 3220                don        trust
## 3221           wildfire         fear
## 3222           wildfire     negative
## 3223           wildfire      sadness
## 3224           wildfire     surprise
## 3225         completely     positive
## 3226               fire         fear
## 3227                ass     negative
## 3228               joke     negative
## 3229              weird      disgust
## 3230              weird     negative
## 3231              swear     positive
## 3232              swear        trust
## 3233           sunshine          joy
## 3234           sunshine     positive
## 3235             friend          joy
## 3236             friend     positive
## 3237             friend        trust
## 3238             friend          joy
## 3239             friend     positive
## 3240             friend        trust
## 3241             coming anticipation
## 3242             pretty anticipation
## 3243             pretty          joy
## 3244             pretty     positive
## 3245             pretty        trust
## 3246      disappointing     negative
## 3247      disappointing      sadness
## 3248             pretty anticipation
## 3249             pretty          joy
## 3250             pretty     positive
## 3251             pretty        trust
## 3252             desert        anger
## 3253             desert      disgust
## 3254             desert         fear
## 3255             desert     negative
## 3256             desert      sadness
## 3257              death        anger
## 3258              death anticipation
## 3259              death      disgust
## 3260              death         fear
## 3261              death     negative
## 3262              death      sadness
## 3263              death     surprise
## 3264               fall     negative
## 3265               fall      sadness
## 3266               late     negative
## 3267               late      sadness
## 3268             august     positive
## 3269                god anticipation
## 3270                god         fear
## 3271                god          joy
## 3272                god     positive
## 3273                god        trust
## 3274                ash     negative
## 3275             blower     negative
## 3276             desert        anger
## 3277             desert      disgust
## 3278             desert         fear
## 3279             desert     negative
## 3280             desert      sadness
## 3281              fault     negative
## 3282              fault      sadness
## 3283              weird      disgust
## 3284              weird     negative
## 3285              sense     positive
## 3286               joke     negative
## 3287          moderator     positive
## 3288          moderator        trust
## 3289              fault     negative
## 3290              fault      sadness
## 3291            sarcasm        anger
## 3292            sarcasm      disgust
## 3293            sarcasm     negative
## 3294            sarcasm      sadness
## 3295              sense     positive
## 3296          beautiful          joy
## 3297          beautiful     positive
## 3298               joke     negative
## 3299             change         fear
## 3300               love          joy
## 3301               love     positive
## 3302             prefer     positive
## 3303             prefer        trust
## 3304            measure        trust
## 3305         enthusiast anticipation
## 3306         enthusiast          joy
## 3307         enthusiast     positive
## 3308         enthusiast     surprise
## 3309         degenerate     negative
## 3310             public anticipation
## 3311             public     positive
## 3312               cool     positive
## 3313                die         fear
## 3314                die     negative
## 3315                die      sadness
## 3316           included     positive
## 3317            account        trust
## 3318          ownership     positive
## 3319               love          joy
## 3320               love     positive
## 3321              cheap     negative
## 3322            exhaust     negative
## 3323              weird      disgust
## 3324              weird     negative
## 3325             option     positive
## 3326        proposition     positive
## 3327              found          joy
## 3328              found     positive
## 3329              found        trust
## 3330                don     positive
## 3331                don        trust
## 3332              sense     positive
## 3333            warning         fear
## 3334              cross        anger
## 3335              cross         fear
## 3336              cross     negative
## 3337              cross      sadness
## 3338          ownership     positive
## 3339               torn     negative
## 3340            excited anticipation
## 3341            excited          joy
## 3342            excited     positive
## 3343            excited     surprise
## 3344            excited        trust
## 3345          convinced        trust
## 3346               time anticipation
## 3347             boring     negative
## 3348               time anticipation
## 3349                bad        anger
## 3350                bad      disgust
## 3351                bad         fear
## 3352                bad     negative
## 3353                bad      sadness
## 3354              worse         fear
## 3355              worse     negative
## 3356              worse      sadness
## 3357               torn     negative
## 3358            excited anticipation
## 3359            excited          joy
## 3360            excited     positive
## 3361            excited     surprise
## 3362            excited        trust
## 3363          convinced        trust
## 3364               time anticipation
## 3365             boring     negative
## 3366               time anticipation
## 3367                bad        anger
## 3368                bad      disgust
## 3369                bad         fear
## 3370                bad     negative
## 3371                bad      sadness
## 3372              worse         fear
## 3373              worse     negative
## 3374              worse      sadness
## 3375                fun anticipation
## 3376                fun          joy
## 3377                fun     positive
## 3378                row        anger
## 3379                row     negative
## 3380            commute     positive
## 3381           pavement        trust
## 3382               nose      disgust
## 3383               atom     positive
## 3384               love          joy
## 3385               love     positive
## 3386              words        anger
## 3387              words     negative
## 3388                fun anticipation
## 3389                fun          joy
## 3390                fun     positive
## 3391              words        anger
## 3392              words     negative
## 3393           constant     positive
## 3394           constant        trust
## 3395               time anticipation
## 3396              spent     negative
## 3397            content          joy
## 3398            content     positive
## 3399            content        trust
## 3400              spent     negative
## 3401             reader     positive
## 3402               glad anticipation
## 3403               glad          joy
## 3404               glad     positive
## 3405               glad anticipation
## 3406               glad          joy
## 3407               glad     positive
## 3408              words        anger
## 3409              words     negative
## 3410             theory anticipation
## 3411             theory        trust
## 3412          ownership     positive
## 3413              model     positive
## 3414               lack     negative
## 3415              worth     positive
## 3416            reading     positive
## 3417          attention     positive
## 3418              shape     positive
## 3419               true          joy
## 3420               true     positive
## 3421               true        trust
## 3422          curiosity anticipation
## 3423          curiosity     positive
## 3424          curiosity     surprise
## 3425          satisfied          joy
## 3426          satisfied     positive
## 3427               fair     positive
## 3428           accurate     positive
## 3429           accurate        trust
## 3430       professional     positive
## 3431       professional        trust
## 3432              noise     negative
## 3433          recommend     positive
## 3434          recommend        trust
## 3435              found          joy
## 3436              found     positive
## 3437              found        trust
## 3438           fatigued     negative
## 3439           fatigued      sadness
## 3440            feeling        anger
## 3441            feeling anticipation
## 3442            feeling      disgust
## 3443            feeling         fear
## 3444            feeling          joy
## 3445            feeling     negative
## 3446            feeling     positive
## 3447            feeling      sadness
## 3448            feeling     surprise
## 3449            feeling        trust
## 3450              noise     negative
## 3451               main     positive
## 3452         suspension         fear
## 3453         suspension     negative
## 3454            beating        anger
## 3455            beating         fear
## 3456            beating     negative
## 3457            beating      sadness
## 3458            hearing         fear
## 3459            hearing     negative
## 3460         suspension         fear
## 3461         suspension     negative
## 3462                fun anticipation
## 3463                fun          joy
## 3464                fun     positive
## 3465               trip     surprise
## 3466              share anticipation
## 3467              share          joy
## 3468              share     positive
## 3469              share        trust
## 3470                fun anticipation
## 3471                fun          joy
## 3472                fun     positive
## 3473            nervous anticipation
## 3474            nervous         fear
## 3475            nervous     negative
## 3476              silly          joy
## 3477              silly     negative
## 3478            fragile         fear
## 3479            fragile     negative
## 3480            fragile      sadness
## 3481             coming anticipation
## 3482                bad        anger
## 3483                bad      disgust
## 3484                bad         fear
## 3485                bad     negative
## 3486                bad      sadness
## 3487          expecting anticipation
## 3488                bad        anger
## 3489                bad      disgust
## 3490                bad         fear
## 3491                bad     negative
## 3492                bad      sadness
## 3493               glad anticipation
## 3494               glad          joy
## 3495               glad     positive
## 3496              truck        trust
## 3497             swerve         fear
## 3498             swerve     surprise
## 3499                die         fear
## 3500                die     negative
## 3501                die      sadness
## 3502             damage        anger
## 3503             damage      disgust
## 3504             damage     negative
## 3505             damage      sadness
## 3506                hit        anger
## 3507                hit     negative
## 3508           cautious anticipation
## 3509           cautious         fear
## 3510           cautious     positive
## 3511           cautious        trust
## 3512           prepared anticipation
## 3513           prepared     positive
## 3514           prepared        trust
## 3515              brawl        anger
## 3516              brawl      disgust
## 3517              brawl         fear
## 3518              brawl     negative
## 3519            fatigue     negative
## 3520              noise     negative
## 3521              noise     negative
## 3522         suspension         fear
## 3523         suspension     negative
## 3524          harshness        anger
## 3525          harshness         fear
## 3526          harshness     negative
## 3527               time anticipation
## 3528               true          joy
## 3529               true     positive
## 3530               true        trust
## 3531        maintenance        trust
## 3532            include     positive
## 3533              daily anticipation
## 3534             stable     positive
## 3535             stable        trust
## 3536             losing        anger
## 3537             losing     negative
## 3538             losing      sadness
## 3539           engaging          joy
## 3540           engaging     positive
## 3541           engaging        trust
## 3542               real     positive
## 3543               real        trust
## 3544              treat        anger
## 3545              treat anticipation
## 3546              treat      disgust
## 3547              treat         fear
## 3548              treat          joy
## 3549              treat     negative
## 3550              treat     positive
## 3551              treat      sadness
## 3552              treat     surprise
## 3553              treat        trust
## 3554              track anticipation
## 3555         completely     positive
## 3556              start anticipation
## 3557            include     positive
## 3558               love          joy
## 3559               love     positive
## 3560          forgotten         fear
## 3561          forgotten     negative
## 3562          forgotten      sadness
## 3563           engaging          joy
## 3564           engaging     positive
## 3565           engaging        trust
## 3566               real     positive
## 3567               real        trust
## 3568              treat        anger
## 3569              treat anticipation
## 3570              treat      disgust
## 3571              treat         fear
## 3572              treat          joy
## 3573              treat     negative
## 3574              treat     positive
## 3575              treat      sadness
## 3576              treat     surprise
## 3577              treat        trust
## 3578              track anticipation
## 3579         completely     positive
## 3580              start anticipation
## 3581           favorite          joy
## 3582           favorite     positive
## 3583           favorite        trust
## 3584            machine        trust
## 3585               real     positive
## 3586               real        trust
## 3587            arrival anticipation
## 3588         ultimately anticipation
## 3589         ultimately     positive
## 3590            comfort anticipation
## 3591            comfort          joy
## 3592            comfort     positive
## 3593            comfort        trust
## 3594              daily anticipation
## 3595               real     positive
## 3596               real        trust
## 3597            helpful          joy
## 3598            helpful     positive
## 3599            helpful        trust
## 3600              found          joy
## 3601              found     positive
## 3602              found        trust
## 3603              agony        anger
## 3604              agony         fear
## 3605              agony     negative
## 3606              agony      sadness
## 3607            ecstasy anticipation
## 3608            ecstasy          joy
## 3609            ecstasy     positive
## 3610         enthusiast anticipation
## 3611         enthusiast          joy
## 3612         enthusiast     positive
## 3613         enthusiast     surprise
## 3614               time anticipation
## 3615              happy anticipation
## 3616              happy          joy
## 3617              happy     positive
## 3618              happy        trust
## 3619             afford     positive
## 3620           annoying        anger
## 3621           annoying     negative
## 3622           disabled         fear
## 3623           disabled     negative
## 3624           disabled      sadness
## 3625              agree     positive
## 3626                fun anticipation
## 3627                fun          joy
## 3628                fun     positive
## 3629              daily anticipation
## 3630            special          joy
## 3631            special     positive
## 3632              treat        anger
## 3633              treat anticipation
## 3634              treat      disgust
## 3635              treat         fear
## 3636              treat          joy
## 3637              treat     negative
## 3638              treat     positive
## 3639              treat      sadness
## 3640              treat     surprise
## 3641              treat        trust
## 3642            special          joy
## 3643            special     positive
## 3644              daily anticipation
## 3645           drudgery     negative
## 3646                fun anticipation
## 3647                fun          joy
## 3648                fun     positive
## 3649           disabled         fear
## 3650           disabled     negative
## 3651           disabled      sadness
## 3652      vulnerability         fear
## 3653      vulnerability     negative
## 3654      vulnerability      sadness
## 3655           solution     positive
## 3656            illegal        anger
## 3657            illegal      disgust
## 3658            illegal         fear
## 3659            illegal     negative
## 3660            illegal      sadness
## 3661              merge anticipation
## 3662              merge     positive
## 3663          excellent          joy
## 3664          excellent     positive
## 3665          excellent        trust
## 3666              agree     positive
## 3667               time anticipation
## 3668          attention     positive
## 3669                top anticipation
## 3670                top     positive
## 3671                top        trust
## 3672            feeling        anger
## 3673            feeling anticipation
## 3674            feeling      disgust
## 3675            feeling         fear
## 3676            feeling          joy
## 3677            feeling     negative
## 3678            feeling     positive
## 3679            feeling      sadness
## 3680            feeling     surprise
## 3681            feeling        trust
## 3682               team        trust
## 3683              sense     positive
## 3684                top anticipation
## 3685                top     positive
## 3686                top        trust
## 3687            special          joy
## 3688            special     positive
## 3689         suspension         fear
## 3690         suspension     negative
## 3691            granted     positive
## 3692        improvement          joy
## 3693        improvement     positive
## 3694        improvement        trust
## 3695             choice     positive
## 3696               hype anticipation
## 3697               hype     negative
## 3698             fierce        anger
## 3699             fierce      disgust
## 3700             fierce         fear
## 3701             fierce     negative
## 3702            neutral anticipation
## 3703            neutral        trust
## 3704        progressive     positive
## 3705             weight anticipation
## 3706             weight      disgust
## 3707             weight         fear
## 3708             weight          joy
## 3709             weight     negative
## 3710             weight     positive
## 3711             weight      sadness
## 3712             weight     surprise
## 3713             weight        trust
## 3714                top anticipation
## 3715                top     positive
## 3716                top        trust
## 3717             secret        trust
## 3718                top anticipation
## 3719                top     positive
## 3720                top        trust
## 3721           improved     positive
## 3722          difficult         fear
## 3723             exotic     positive
## 3724              level     positive
## 3725              level        trust
## 3726          seduction     negative
## 3727            forward     positive
## 3728          improving     positive
## 3729            special          joy
## 3730            special     positive
## 3731           creature      disgust
## 3732           creature         fear
## 3733           creature     negative
## 3734              agree     positive
## 3735         journalism        trust
## 3736              words        anger
## 3737              words     negative
## 3738               love          joy
## 3739               love     positive
## 3740         journalism        trust
## 3741          desirable     positive
## 3742        opportunity anticipation
## 3743        opportunity     positive
## 3744                top anticipation
## 3745                top     positive
## 3746                top        trust
## 3747               true          joy
## 3748               true     positive
## 3749               true        trust
## 3750         enthusiast anticipation
## 3751         enthusiast          joy
## 3752         enthusiast     positive
## 3753         enthusiast     surprise
## 3754              ready anticipation
## 3755                top anticipation
## 3756                top     positive
## 3757                top        trust
## 3758                top anticipation
## 3759                top     positive
## 3760                top        trust
## 3761               pain         fear
## 3762               pain     negative
## 3763               pain      sadness
## 3764             remove        anger
## 3765             remove         fear
## 3766             remove     negative
## 3767             remove      sadness
## 3768               time anticipation
## 3769        reliability     positive
## 3770        reliability        trust
## 3771        maintenance        trust
## 3772         impression     positive
## 3773              track anticipation
## 3774           headache     negative
## 3775               time anticipation
## 3776        maintenance        trust
## 3777             expect anticipation
## 3778             expect     positive
## 3779             expect     surprise
## 3780             expect        trust
## 3781              cheap     negative
## 3782              noise     negative
## 3783              noise     negative
## 3784           interior      disgust
## 3785           interior     positive
## 3786           interior        trust
## 3787             decent     positive
## 3788              noise     negative
## 3789              enjoy anticipation
## 3790              enjoy          joy
## 3791              enjoy     positive
## 3792              enjoy        trust
## 3793               plan anticipation
## 3794             policy        trust
## 3795              model     positive
## 3796             policy        trust
## 3797        reliability     positive
## 3798        reliability        trust
## 3799              wrong     negative
## 3800              noise     negative
## 3801               wear     negative
## 3802               wear        trust
## 3803         unreliable     negative
## 3804         unreliable        trust
## 3805        maintenance        trust
## 3806          reluctant         fear
## 3807          reluctant     negative
## 3808            special          joy
## 3809            special     positive
## 3810             appeal anticipation
## 3811            explain     positive
## 3812            explain        trust
## 3813               gear     positive
## 3814           throttle        anger
## 3815           throttle     negative
## 3816      understanding     positive
## 3817      understanding        trust
## 3818           throttle        anger
## 3819           throttle     negative
## 3820             depend anticipation
## 3821             depend        trust
## 3822               gear     positive
## 3823       disconnected     negative
## 3824       disconnected      sadness
## 3825            explain     positive
## 3826            explain        trust
## 3827           throttle        anger
## 3828           throttle     negative
## 3829               stab        anger
## 3830               stab         fear
## 3831               stab     negative
## 3832               stab      sadness
## 3833               stab     surprise
## 3834               stab        anger
## 3835               stab         fear
## 3836               stab     negative
## 3837               stab      sadness
## 3838               stab     surprise
## 3839             proper     positive
## 3840              catch     surprise
## 3841              guess     surprise
## 3842           throttle        anger
## 3843           throttle     negative
## 3844             sudden     surprise
## 3845               hope anticipation
## 3846               hope          joy
## 3847               hope     positive
## 3848               hope     surprise
## 3849               hope        trust
## 3850               real     positive
## 3851               real        trust
## 3852             stable     positive
## 3853             stable        trust
## 3854               hope anticipation
## 3855               hope          joy
## 3856               hope     positive
## 3857               hope     surprise
## 3858               hope        trust
## 3859              crazy        anger
## 3860              crazy         fear
## 3861              crazy     negative
## 3862              crazy      sadness
## 3863               hope anticipation
## 3864               hope          joy
## 3865               hope     positive
## 3866               hope     surprise
## 3867               hope        trust
## 3868              alive anticipation
## 3869              alive          joy
## 3870              alive     positive
## 3871              alive        trust
## 3872              coast     positive
## 3873               pick     positive
## 3874           received     positive
## 3875               word     positive
## 3876               word        trust
## 3877              broke         fear
## 3878              broke     negative
## 3879              broke      sadness
## 3880            content          joy
## 3881            content     positive
## 3882            content        trust
## 3883               love          joy
## 3884               love     positive
## 3885               real     positive
## 3886               real        trust
## 3887              share anticipation
## 3888              share          joy
## 3889              share     positive
## 3890              share        trust
## 3891            content          joy
## 3892            content     positive
## 3893            content        trust
## 3894               save          joy
## 3895               save     positive
## 3896               save        trust
## 3897              money        anger
## 3898              money anticipation
## 3899              money          joy
## 3900              money     positive
## 3901              money     surprise
## 3902              money        trust
## 3903                fun anticipation
## 3904                fun          joy
## 3905                fun     positive
## 3906              start anticipation
## 3907         occasional     surprise
## 3908                pop     negative
## 3909                pop     surprise
## 3910               glad anticipation
## 3911               glad          joy
## 3912               glad     positive
## 3913           enjoying anticipation
## 3914           enjoying          joy
## 3915           enjoying     positive
## 3916           enjoying        trust
## 3917               hope anticipation
## 3918               hope          joy
## 3919               hope     positive
## 3920               hope     surprise
## 3921               hope        trust
## 3922              learn     positive
## 3923             pretty anticipation
## 3924             pretty          joy
## 3925             pretty     positive
## 3926             pretty        trust
## 3927            special          joy
## 3928            special     positive
## 3929            special          joy
## 3930            special     positive
## 3931             effort     positive
## 3932          ownership     positive
## 3933         constantly        trust
## 3934       disappointed        anger
## 3935       disappointed      disgust
## 3936       disappointed     negative
## 3937       disappointed      sadness
## 3938         production anticipation
## 3939         production     positive
## 3940              idiot      disgust
## 3941              idiot     negative
## 3942              proof        trust
## 3943          existence     positive
## 3944          civilized          joy
## 3945          civilized     positive
## 3946          civilized        trust
## 3947              sense     positive
## 3948               word     positive
## 3949               word        trust
## 3950               love          joy
## 3951               love     positive
## 3952              cross        anger
## 3953              cross         fear
## 3954              cross     negative
## 3955              cross      sadness
## 3956               team        trust
## 3957                fun anticipation
## 3958                fun          joy
## 3959                fun     positive
## 3960               doom         fear
## 3961               doom     negative
## 3962              panic         fear
## 3963              panic     negative
## 3964            painful        anger
## 3965            painful      disgust
## 3966            painful         fear
## 3967            painful     negative
## 3968            painful      sadness
## 3969              daily anticipation
## 3970              learn     positive
## 3971               love          joy
## 3972               love     positive
## 3973                don     positive
## 3974                don        trust
## 3975          agonizing         fear
## 3976          agonizing     negative
## 3977            helpful          joy
## 3978            helpful     positive
## 3979            helpful        trust
## 3980              noted     positive
## 3981            failing        anger
## 3982            failing anticipation
## 3983            failing         fear
## 3984            failing     negative
## 3985            failing      sadness
## 3986                hot        anger
## 3987           question     positive
## 3988             honest        anger
## 3989             honest      disgust
## 3990             honest         fear
## 3991             honest          joy
## 3992             honest     positive
## 3993             honest      sadness
## 3994             honest        trust
## 3995               gear     positive
## 3996            worried     negative
## 3997            worried      sadness
## 3998          committed     positive
## 3999          committed        trust
## 4000           throttle        anger
## 4001           throttle     negative
## 4002              sweet anticipation
## 4003              sweet          joy
## 4004              sweet     positive
## 4005              sweet     surprise
## 4006              sweet        trust
## 4007              sense     positive
## 4008              broke         fear
## 4009              broke     negative
## 4010              broke      sadness
## 4011             exotic     positive
## 4012              laugh          joy
## 4013              laugh     positive
## 4014              laugh     surprise
## 4015               shed     negative
## 4016            suspect         fear
## 4017            suspect     negative
## 4018               time anticipation
## 4019           pandemic         fear
## 4020           pandemic     negative
## 4021           pandemic      sadness
## 4022            suspect         fear
## 4023            suspect     negative
## 4024            formula     positive
## 4025            formula        trust
## 4026                don     positive
## 4027                don        trust
## 4028              spoke     negative
## 4029               cool     positive
## 4030               pill     positive
## 4031               pill        trust
## 4032              found          joy
## 4033              found     positive
## 4034              found        trust
## 4035            hearing         fear
## 4036            hearing     negative
## 4037               time anticipation
## 4038                bad        anger
## 4039                bad      disgust
## 4040                bad         fear
## 4041                bad     negative
## 4042                bad      sadness
## 4043              happy anticipation
## 4044              happy          joy
## 4045              happy     positive
## 4046              happy        trust
## 4047            reading     positive
## 4048          difficult         fear
## 4049      inconsistency     negative
## 4050                bad        anger
## 4051                bad      disgust
## 4052                bad         fear
## 4053                bad     negative
## 4054                bad      sadness
## 4055          willingly     positive
## 4056               rule         fear
## 4057               rule        trust
## 4058               joke     negative
## 4059             action     positive
## 4060            contact     positive
## 4061               glad anticipation
## 4062               glad          joy
## 4063               glad     positive
## 4064             unique     positive
## 4065             unique     surprise
## 4066               hope anticipation
## 4067               hope          joy
## 4068               hope     positive
## 4069               hope     surprise
## 4070               hope        trust
## 4071         attainable anticipation
## 4072         attainable     positive
## 4073              model     positive
## 4074              model     positive
## 4075               base        trust
## 4076          statement     positive
## 4077          statement        trust
## 4078                art anticipation
## 4079                art          joy
## 4080                art     positive
## 4081                art      sadness
## 4082                art     surprise
## 4083             change         fear
## 4084          resources          joy
## 4085          resources     positive
## 4086          resources        trust
## 4087           collapse      disgust
## 4088           collapse         fear
## 4089           collapse     negative
## 4090           collapse      sadness
## 4091             change         fear
## 4092          resources          joy
## 4093          resources     positive
## 4094          resources        trust
## 4095               true          joy
## 4096               true     positive
## 4097               true        trust
## 4098             canary     positive
## 4099           collapse      disgust
## 4100           collapse         fear
## 4101           collapse     negative
## 4102           collapse      sadness
## 4103               true          joy
## 4104               true     positive
## 4105               true        trust
## 4106               lose        anger
## 4107               lose      disgust
## 4108               lose         fear
## 4109               lose     negative
## 4110               lose      sadness
## 4111               lose     surprise
## 4112                sea     positive
## 4113              level     positive
## 4114              level        trust
## 4115               lose        anger
## 4116               lose      disgust
## 4117               lose         fear
## 4118               lose     negative
## 4119               lose      sadness
## 4120               lose     surprise
## 4121           mortgage         fear
## 4122            plummet         fear
## 4123            plummet     negative
## 4124                sea     positive
## 4125              cover        trust
## 4126                god anticipation
## 4127                god         fear
## 4128                god          joy
## 4129                god     positive
## 4130                god        trust
## 4131               cold     negative
## 4132             vermin        anger
## 4133             vermin      disgust
## 4134             vermin         fear
## 4135             vermin     negative
## 4136           wildfire         fear
## 4137           wildfire     negative
## 4138           wildfire      sadness
## 4139           wildfire     surprise
## 4140              flood         fear
## 4141               hail     negative
## 4142               hail     positive
## 4143               hail        trust
## 4144               fire         fear
## 4145              cover        trust
## 4146              start anticipation
## 4147               deal anticipation
## 4148               deal          joy
## 4149               deal     positive
## 4150               deal     surprise
## 4151               deal        trust
## 4152                god anticipation
## 4153                god         fear
## 4154                god          joy
## 4155                god     positive
## 4156                god        trust
## 4157            expired     negative
## 4158              force        anger
## 4159              force         fear
## 4160              force     negative
## 4161            godless        anger
## 4162            godless     negative
## 4163           accurate     positive
## 4164           accurate        trust
## 4165             giving     positive
## 4166            worried     negative
## 4167            worried      sadness
## 4168             insure     positive
## 4169             insure        trust
## 4170             policy        trust
## 4171             reason     positive
## 4172               deny        anger
## 4173               deny     negative
## 4174               mate     positive
## 4175               mate        trust
## 4176              guess     surprise
## 4177              lucky          joy
## 4178              lucky     positive
## 4179              lucky     surprise
## 4180           disorder         fear
## 4181           disorder     negative
## 4182             denied     negative
## 4183             denied      sadness
## 4184             happen anticipation
## 4185             system        trust
## 4186           collapse      disgust
## 4187           collapse         fear
## 4188           collapse     negative
## 4189           collapse      sadness
## 4190              worse         fear
## 4191              worse     negative
## 4192              worse      sadness
## 4193               time anticipation
## 4194             rising anticipation
## 4195             rising          joy
## 4196             rising     positive
## 4197              worse         fear
## 4198              worse     negative
## 4199              worse      sadness
## 4200           planning anticipation
## 4201           planning     positive
## 4202           planning        trust
## 4203              guess     surprise
## 4204               lose        anger
## 4205               lose      disgust
## 4206               lose         fear
## 4207               lose     negative
## 4208               lose      sadness
## 4209               lose     surprise
## 4210              money        anger
## 4211              money anticipation
## 4212              money          joy
## 4213              money     positive
## 4214              money     surprise
## 4215              money        trust
## 4216              lines         fear
## 4217               time anticipation
## 4218            include     positive
## 4219             injury        anger
## 4220             injury         fear
## 4221             injury     negative
## 4222             injury      sadness
## 4223               tort     negative
## 4224                law        trust
## 4225              money        anger
## 4226              money anticipation
## 4227              money          joy
## 4228              money     positive
## 4229              money     surprise
## 4230              money        trust
## 4231            chronic     negative
## 4232            chronic      sadness
## 4233           disaster        anger
## 4234           disaster      disgust
## 4235           disaster         fear
## 4236           disaster     negative
## 4237           disaster      sadness
## 4238           disaster     surprise
## 4239          painfully     negative
## 4240          painfully      sadness
## 4241            obvious     positive
## 4242            obvious        trust
## 4243            economy        trust
## 4244               real     positive
## 4245               real        trust
## 4246              watch anticipation
## 4247              watch         fear
## 4248             reason     positive
## 4249                top anticipation
## 4250                top     positive
## 4251                top        trust
## 4252             afford     positive
## 4253                pay anticipation
## 4254                pay          joy
## 4255                pay     positive
## 4256                pay        trust
## 4257               cash        anger
## 4258               cash anticipation
## 4259               cash         fear
## 4260               cash          joy
## 4261               cash     positive
## 4262               cash        trust
## 4263             expect anticipation
## 4264             expect     positive
## 4265             expect     surprise
## 4266             expect        trust
## 4267              money        anger
## 4268              money anticipation
## 4269              money          joy
## 4270              money     positive
## 4271              money     surprise
## 4272              money        trust
## 4273          assurance     positive
## 4274          assurance        trust
## 4275              crash         fear
## 4276              crash     negative
## 4277              crash      sadness
## 4278              crash     surprise
## 4279              money        anger
## 4280              money anticipation
## 4281              money          joy
## 4282              money     positive
## 4283              money     surprise
## 4284              money        trust
## 4285              agree     positive
## 4286          inflation         fear
## 4287          inflation     negative
## 4288          influence     negative
## 4289          influence     positive
## 4290            benefit     positive
## 4291             expect anticipation
## 4292             expect     positive
## 4293             expect     surprise
## 4294             expect        trust
## 4295            granted     positive
## 4296             expect anticipation
## 4297             expect     positive
## 4298             expect     surprise
## 4299             expect        trust
## 4300              money        anger
## 4301              money anticipation
## 4302              money          joy
## 4303              money     positive
## 4304              money     surprise
## 4305              money        trust
## 4306               time anticipation
## 4307            horizon anticipation
## 4308            horizon     positive
## 4309               risk anticipation
## 4310               risk         fear
## 4311               risk     negative
## 4312            related        trust
## 4313              argue        anger
## 4314              argue     negative
## 4315            bargain     positive
## 4316            bargain        trust
## 4317          providing anticipation
## 4318          providing          joy
## 4319          providing     positive
## 4320          providing        trust
## 4321            economy        trust
## 4322             scheme     negative
## 4323            account        trust
## 4324              death        anger
## 4325              death anticipation
## 4326              death      disgust
## 4327              death         fear
## 4328              death     negative
## 4329              death      sadness
## 4330              death     surprise
## 4331               cult         fear
## 4332               cult     negative
## 4333          providing anticipation
## 4334          providing          joy
## 4335          providing     positive
## 4336          providing        trust
## 4337            leaning        trust
## 4338             reason     positive
## 4339            forgive     positive
## 4340            ancient     negative
## 4341            ancient     negative
## 4342              wages          joy
## 4343              wages     positive
## 4344               rule         fear
## 4345               rule        trust
## 4346             modest     positive
## 4347             modest        trust
## 4348             versus        anger
## 4349             versus     negative
## 4350       reproductive          joy
## 4351       reproductive     positive
## 4352            obvious     positive
## 4353            obvious        trust
## 4354               lead     positive
## 4355               debt     negative
## 4356               debt      sadness
## 4357              happy anticipation
## 4358              happy          joy
## 4359              happy     positive
## 4360              happy        trust
## 4361               talk     positive
## 4362          necessity      sadness
## 4363            damages     negative
## 4364            damages      sadness
## 4365            exposed     negative
## 4366                rot      disgust
## 4367                rot         fear
## 4368                rot     negative
## 4369                rot      sadness
## 4370               cool     positive
## 4371         government         fear
## 4372         government     negative
## 4373             system        trust
## 4374                die         fear
## 4375                die     negative
## 4376                die      sadness
## 4377             denial     negative
## 4378             effort     positive
## 4379                sue        anger
## 4380                sue     negative
## 4381                sue      sadness
## 4382         government         fear
## 4383         government     negative
## 4384            damages     negative
## 4385            damages      sadness
## 4386             change         fear
## 4387             happen anticipation
## 4388               risk anticipation
## 4389               risk         fear
## 4390               risk     negative
## 4391           wildfire         fear
## 4392           wildfire     negative
## 4393           wildfire      sadness
## 4394           wildfire     surprise
## 4395         ultimately anticipation
## 4396         ultimately     positive
## 4397           threaten        anger
## 4398           threaten anticipation
## 4399           threaten         fear
## 4400           threaten     negative
## 4401              legal     positive
## 4402              legal        trust
## 4403              major     positive
## 4404          difficult         fear
## 4405               loss        anger
## 4406               loss         fear
## 4407               loss     negative
## 4408               loss      sadness
## 4409             assets     positive
## 4410             assets     positive
## 4411              model     positive
## 4412               time anticipation
## 4413             expect anticipation
## 4414             expect     positive
## 4415             expect     surprise
## 4416             expect        trust
## 4417           wildfire         fear
## 4418           wildfire     negative
## 4419           wildfire      sadness
## 4420           wildfire     surprise
## 4421              money        anger
## 4422              money anticipation
## 4423              money          joy
## 4424              money     positive
## 4425              money     surprise
## 4426              money        trust
## 4427             insure     positive
## 4428             insure        trust
## 4429             insure     positive
## 4430             insure        trust
## 4431               loss        anger
## 4432               loss         fear
## 4433               loss     negative
## 4434               loss      sadness
## 4435             reason     positive
## 4436               loss        anger
## 4437               loss         fear
## 4438               loss     negative
## 4439               loss      sadness
## 4440               risk anticipation
## 4441               risk         fear
## 4442               risk     negative
## 4443               loss        anger
## 4444               loss         fear
## 4445               loss     negative
## 4446               loss      sadness
## 4447               risk anticipation
## 4448               risk         fear
## 4449               risk     negative
## 4450               risk anticipation
## 4451               risk         fear
## 4452               risk     negative
## 4453             reward anticipation
## 4454             reward          joy
## 4455             reward     positive
## 4456             reward     surprise
## 4457             reward        trust
## 4458            success anticipation
## 4459            success          joy
## 4460            success     positive
## 4461               risk anticipation
## 4462               risk         fear
## 4463               risk     negative
## 4464               risk anticipation
## 4465               risk         fear
## 4466               risk     negative
## 4467              money        anger
## 4468              money anticipation
## 4469              money          joy
## 4470              money     positive
## 4471              money     surprise
## 4472              money        trust
## 4473               time anticipation
## 4474              leave     negative
## 4475              leave      sadness
## 4476              leave     surprise
## 4477               rest     positive
## 4478            begging     negative
## 4479           question     positive
## 4480               risk anticipation
## 4481               risk         fear
## 4482               risk     negative
## 4483         management     positive
## 4484         management        trust
## 4485            failure      disgust
## 4486            failure         fear
## 4487            failure     negative
## 4488            failure      sadness
## 4489               risk anticipation
## 4490               risk         fear
## 4491               risk     negative
## 4492            failure      disgust
## 4493            failure         fear
## 4494            failure     negative
## 4495            failure      sadness
## 4496            failure      disgust
## 4497            failure         fear
## 4498            failure     negative
## 4499            failure      sadness
## 4500               risk anticipation
## 4501               risk         fear
## 4502               risk     negative
## 4503               late     negative
## 4504               late      sadness
## 4505            failure      disgust
## 4506            failure         fear
## 4507            failure     negative
## 4508            failure      sadness
## 4509               risk anticipation
## 4510               risk         fear
## 4511               risk     negative
## 4512          destroyed        anger
## 4513          destroyed         fear
## 4514          destroyed     negative
## 4515          destroyed      sadness
## 4516               time anticipation
## 4517               tree        anger
## 4518               tree anticipation
## 4519               tree      disgust
## 4520               tree          joy
## 4521               tree     positive
## 4522               tree     surprise
## 4523               tree        trust
## 4524             chance     surprise
## 4525            failure      disgust
## 4526            failure         fear
## 4527            failure     negative
## 4528            failure      sadness
## 4529             chance     surprise
## 4530          destroyed        anger
## 4531          destroyed         fear
## 4532          destroyed     negative
## 4533          destroyed      sadness
## 4534               risk anticipation
## 4535               risk         fear
## 4536               risk     negative
## 4537       collectively     positive
## 4538       collectively        trust
## 4539            unlucky        anger
## 4540            unlucky      disgust
## 4541            unlucky         fear
## 4542            unlucky     negative
## 4543            unlucky      sadness
## 4544                god anticipation
## 4545                god         fear
## 4546                god          joy
## 4547                god     positive
## 4548                god        trust
## 4549               risk anticipation
## 4550               risk         fear
## 4551               risk     negative
## 4552         management     positive
## 4553         management        trust
## 4554            subject     negative
## 4555         government         fear
## 4556         government     negative
## 4557           reckless        anger
## 4558           reckless         fear
## 4559           reckless     negative
## 4560      comprehensive     positive
## 4561              words        anger
## 4562              words     negative
## 4563            subject     negative
## 4564             damage        anger
## 4565             damage      disgust
## 4566             damage     negative
## 4567             damage      sadness
## 4568      comprehensive     positive
## 4569              cover        trust
## 4570              flood         fear
## 4571             rising anticipation
## 4572             rising          joy
## 4573             rising     positive
## 4574              cover        trust
## 4575              flood         fear
## 4576             damage        anger
## 4577             damage      disgust
## 4578             damage     negative
## 4579             damage      sadness
## 4580         impossible     negative
## 4581         impossible      sadness
## 4582              flood         fear
## 4583              money        anger
## 4584              money anticipation
## 4585              money          joy
## 4586              money     positive
## 4587              money     surprise
## 4588              money        trust
## 4589         completely     positive
## 4590          insolvent         fear
## 4591          insolvent     negative
## 4592          insolvent      sadness
## 4593          insolvent        trust
## 4594              flood         fear
## 4595         population     positive
## 4596              sense     positive
## 4597            advised        trust
## 4598              worse         fear
## 4599              worse     negative
## 4600              worse      sadness
## 4601             change         fear
## 4602              handy     positive
## 4603            bargain     positive
## 4604            bargain        trust
## 4605               team        trust
## 4606            engaged anticipation
## 4607            engaged          joy
## 4608            engaged     positive
## 4609            engaged        trust
## 4610             afford     positive
## 4611               time anticipation
## 4612          declining     negative
## 4613               loss        anger
## 4614               loss         fear
## 4615               loss     negative
## 4616               loss      sadness
## 4617           mortgage         fear
## 4618           mortgage         fear
## 4619               bank        trust
## 4620              sense     positive
## 4621               true          joy
## 4622               true     positive
## 4623               true        trust
## 4624             system        trust
## 4625         impossible     negative
## 4626         impossible      sadness
## 4627             create          joy
## 4628             create     positive
## 4629              serve     negative
## 4630              serve        trust
## 4631            benefit     positive
## 4632            pollute      disgust
## 4633            pollute     negative
## 4634               soil      disgust
## 4635               soil     negative
## 4636            endemic      disgust
## 4637            endemic         fear
## 4638            endemic     negative
## 4639            endemic      sadness
## 4640               safe          joy
## 4641               safe     positive
## 4642               safe        trust
## 4643               lost     negative
## 4644               lost      sadness
## 4645              bonus anticipation
## 4646              bonus          joy
## 4647              bonus     positive
## 4648              bonus     surprise
## 4649             broken        anger
## 4650             broken         fear
## 4651             broken     negative
## 4652             broken      sadness
## 4653             system        trust
## 4654              watch anticipation
## 4655              watch         fear
## 4656               love          joy
## 4657               love     positive
## 4658          dependent     negative
## 4659          dependent     positive
## 4660          dependent        trust
## 4661                sex anticipation
## 4662                sex          joy
## 4663                sex     positive
## 4664                sex        trust
## 4665      determination     positive
## 4666      determination        trust
## 4667               cold     negative
## 4668              scaly     negative
## 4669               safe          joy
## 4670               safe     positive
## 4671               safe        trust
## 4672             change         fear
## 4673                hot        anger
## 4674                sex anticipation
## 4675                sex          joy
## 4676                sex     positive
## 4677                sex        trust
## 4678               damn        anger
## 4679               damn      disgust
## 4680               damn     negative
## 4681             change         fear
## 4682              worry anticipation
## 4683              worry         fear
## 4684              worry     negative
## 4685              worry      sadness
## 4686                bad        anger
## 4687                bad      disgust
## 4688                bad         fear
## 4689                bad     negative
## 4690                bad      sadness
## 4691              flood         fear
## 4692              flood         fear
## 4693            perfect anticipation
## 4694            perfect          joy
## 4695            perfect     positive
## 4696            perfect        trust
## 4697             chance     surprise
## 4698             chance     surprise
## 4699               love          joy
## 4700               love     positive
## 4701       architecture        trust
## 4702              flood         fear
## 4703            readily     positive
## 4704            include     positive
## 4705           politics        anger
## 4706             ignore     negative
## 4707           frighten         fear
## 4708           frighten     negative
## 4709           frighten      sadness
## 4710           frighten     surprise
## 4711             coming anticipation
## 4712           increase     positive
## 4713             author     positive
## 4714             author        trust
## 4715              storm        anger
## 4716              storm     negative
## 4717              flood         fear
## 4718             happen anticipation
## 4719           terrible        anger
## 4720           terrible      disgust
## 4721           terrible         fear
## 4722           terrible     negative
## 4723           terrible      sadness
## 4724      communication        trust
## 4725             poorly     negative
## 4726               safe          joy
## 4727               safe     positive
## 4728               safe        trust
## 4729               time anticipation
## 4730              flood         fear
## 4731             chance     surprise
## 4732              flood         fear
## 4733             chance     surprise
## 4734              worse         fear
## 4735              worse     negative
## 4736              worse      sadness
## 4737        probability anticipation
## 4738             change         fear
## 4739             sudden     surprise
## 4740               time anticipation
## 4741             create          joy
## 4742             create     positive
## 4743              adapt     positive
## 4744             manage     positive
## 4745             manage        trust
## 4746         management     positive
## 4747         management        trust
## 4748             system        trust
## 4749               plan anticipation
## 4750         management     positive
## 4751         management        trust
## 4752            leisure anticipation
## 4753            leisure          joy
## 4754            leisure     positive
## 4755            leisure     surprise
## 4756            leisure        trust
## 4757                fun anticipation
## 4758                fun          joy
## 4759                fun     positive
## 4760             debate     positive
## 4761              fight        anger
## 4762              fight         fear
## 4763              fight     negative
## 4764              worse         fear
## 4765              worse     negative
## 4766              worse      sadness
## 4767             debate     positive
## 4768              fight        anger
## 4769              fight         fear
## 4770              fight     negative
## 4771          desperate     negative
## 4772          inflation         fear
## 4773          inflation     negative
## 4774              sense     positive
## 4775             lowest     negative
## 4776             lowest      sadness
## 4777          including     positive
## 4778         unreliable     negative
## 4779         unreliable        trust
## 4780              wrong     negative
## 4781           variable     surprise
## 4782           reliable     positive
## 4783           reliable        trust
## 4784               base        trust
## 4785                don     positive
## 4786                don        trust
## 4787              ahead     positive
## 4788               real     positive
## 4789               real        trust
## 4790               time anticipation
## 4791             change         fear
## 4792              surge     surprise
## 4793              track anticipation
## 4794              trend     positive
## 4795           congress      disgust
## 4796           congress        trust
## 4797                gut      disgust
## 4798              start anticipation
## 4799              spite        anger
## 4800              spite     negative
## 4801             reform     positive
## 4802               hope anticipation
## 4803               hope          joy
## 4804               hope     positive
## 4805               hope     surprise
## 4806               hope        trust
## 4807           continue anticipation
## 4808           continue     positive
## 4809           continue        trust
## 4810              worse         fear
## 4811              worse     negative
## 4812              worse      sadness
## 4813             reason     positive
## 4814           continue anticipation
## 4815           continue     positive
## 4816           continue        trust
## 4817              worse         fear
## 4818              worse     negative
## 4819              worse      sadness
## 4820            unknown anticipation
## 4821            unknown         fear
## 4822            unknown     negative
## 4823             doomed         fear
## 4824             doomed     negative
## 4825             doomed      sadness
## 4826               late     negative
## 4827               late      sadness
## 4828          surveying     positive
## 4829              delay        anger
## 4830              delay      disgust
## 4831              delay         fear
## 4832              delay     negative
## 4833              delay      sadness
## 4834             theory anticipation
## 4835             theory        trust
## 4836               time anticipation
## 4837            runaway     negative
## 4838            runaway      sadness
## 4839           disaster        anger
## 4840           disaster      disgust
## 4841           disaster         fear
## 4842           disaster     negative
## 4843           disaster      sadness
## 4844           disaster     surprise
## 4845               jump          joy
## 4846               jump     positive
## 4847              prove     positive
## 4848             chance     surprise
## 4849            screwed        anger
## 4850            screwed     negative
## 4851             reason     positive
## 4852               vote        anger
## 4853               vote anticipation
## 4854               vote          joy
## 4855               vote     negative
## 4856               vote     positive
## 4857               vote      sadness
## 4858               vote     surprise
## 4859               vote        trust
## 4860               blue      sadness
## 4861               hate        anger
## 4862               hate      disgust
## 4863               hate         fear
## 4864               hate     negative
## 4865               hate      sadness
## 4866               hate        anger
## 4867               hate      disgust
## 4868               hate         fear
## 4869               hate     negative
## 4870               hate      sadness
## 4871             senate        trust
## 4872           commerce        trust
## 4873          committee        trust
## 4874            leading        trust
## 4875             budget        trust
## 4876             change         fear
## 4877             speech     positive
## 4878             change         fear
## 4879             credit     positive
## 4880             credit        trust
## 4881               deny        anger
## 4882               deny     negative
## 4883              choke        anger
## 4884              choke     negative
## 4885              choke      sadness
## 4886              death        anger
## 4887              death anticipation
## 4888              death      disgust
## 4889              death         fear
## 4890              death     negative
## 4891              death      sadness
## 4892              death     surprise
## 4893              broil        anger
## 4894              broil     negative
## 4895              death        anger
## 4896              death anticipation
## 4897              death      disgust
## 4898              death         fear
## 4899              death     negative
## 4900              death      sadness
## 4901              death     surprise
## 4902            default      disgust
## 4903            default         fear
## 4904            default     negative
## 4905            default      sadness
## 4906         conspiracy         fear
## 4907                war         fear
## 4908                war     negative
## 4909        responsible     positive
## 4910        responsible        trust
## 4911              child anticipation
## 4912              child          joy
## 4913              child     positive
## 4914                gun        anger
## 4915                gun         fear
## 4916                gun     negative
## 4917             plight anticipation
## 4918             plight      disgust
## 4919             plight         fear
## 4920             plight     negative
## 4921             plight      sadness
## 4922              upset        anger
## 4923              upset     negative
## 4924              upset      sadness
## 4925               doom         fear
## 4926               doom     negative
## 4927                don     positive
## 4928                don        trust
## 4929           politics        anger
## 4930            corrupt     negative
## 4931              serve     negative
## 4932              serve        trust
## 4933             suffer     negative
## 4934          suffering      disgust
## 4935          suffering         fear
## 4936          suffering     negative
## 4937          suffering      sadness
## 4938               vote        anger
## 4939               vote anticipation
## 4940               vote          joy
## 4941               vote     negative
## 4942               vote     positive
## 4943               vote      sadness
## 4944               vote     surprise
## 4945               vote        trust
## 4946       embarrassing     negative
## 4947               hell        anger
## 4948               hell      disgust
## 4949               hell         fear
## 4950               hell     negative
## 4951               hell      sadness
## 4952             change         fear
## 4953               hate        anger
## 4954               hate      disgust
## 4955               hate         fear
## 4956               hate     negative
## 4957               hate      sadness
## 4958           majority          joy
## 4959           majority     positive
## 4960           majority        trust
## 4961                don     positive
## 4962                don        trust
## 4963               hope anticipation
## 4964               hope          joy
## 4965               hope     positive
## 4966               hope     surprise
## 4967               hope        trust
## 4968             expect anticipation
## 4969             expect     positive
## 4970             expect     surprise
## 4971             expect        trust
## 4972            corrupt     negative
## 4973              cruel        anger
## 4974              cruel      disgust
## 4975              cruel         fear
## 4976              cruel     negative
## 4977              cruel      sadness
## 4978              spent     negative
## 4979           fighting        anger
## 4980           fighting     negative
## 4981           expected anticipation
## 4982             change         fear
## 4983            bizarre     negative
## 4984            bizarre     surprise
## 4985             stupid     negative
## 4986             denied     negative
## 4987             denied      sadness
## 4988             denied     negative
## 4989             denied      sadness
## 4990              prove     positive
## 4991               real     positive
## 4992               real        trust
## 4993              prove     positive
## 4994              major     positive
## 4995              leave     negative
## 4996              leave      sadness
## 4997              leave     surprise
## 4998             change         fear
## 4999               real     positive
## 5000               real        trust
## 5001               save          joy
## 5002               save     positive
## 5003               save        trust
## 5004              sadly     negative
## 5005              sadly      sadness
## 5006              greed        anger
## 5007              greed      disgust
## 5008              greed     negative
## 5009             threat        anger
## 5010             threat         fear
## 5011             threat     negative
## 5012             change         fear
## 5013           advanced     positive
## 5014         conspiracy         fear
## 5015          encourage          joy
## 5016          encourage     positive
## 5017          encourage        trust
## 5018          influence     negative
## 5019          influence     positive
## 5020              trend     positive
## 5021             change         fear
## 5022           argument        anger
## 5023           argument     negative
## 5024               lose        anger
## 5025               lose      disgust
## 5026               lose         fear
## 5027               lose     negative
## 5028               lose      sadness
## 5029               lose     surprise
## 5030               slip     negative
## 5031               slip     surprise
## 5032               fall     negative
## 5033               fall      sadness
## 5034           alliance        trust
## 5035               damn        anger
## 5036               damn      disgust
## 5037               damn     negative
## 5038              agree     positive
## 5039         deficiency     negative
## 5040            poverty        anger
## 5041            poverty      disgust
## 5042            poverty         fear
## 5043            poverty     negative
## 5044            poverty      sadness
## 5045              bitch        anger
## 5046              bitch      disgust
## 5047              bitch         fear
## 5048              bitch     negative
## 5049              bitch      sadness
## 5050               gear     positive
## 5051            limited        anger
## 5052            limited     negative
## 5053            limited      sadness
## 5054               cool     positive
## 5055             ground        trust
## 5056            rotting      disgust
## 5057            rotting     negative
## 5058              vital     positive
## 5059          destroyed        anger
## 5060          destroyed         fear
## 5061          destroyed     negative
## 5062          destroyed      sadness
## 5063             ruined        anger
## 5064             ruined      disgust
## 5065             ruined         fear
## 5066             ruined     negative
## 5067             ruined      sadness
## 5068               kill         fear
## 5069               kill     negative
## 5070               kill      sadness
## 5071               sick      disgust
## 5072               sick     negative
## 5073               sick      sadness
## 5074           alliance        trust
## 5075             mother anticipation
## 5076             mother          joy
## 5077             mother     negative
## 5078             mother     positive
## 5079             mother      sadness
## 5080             mother        trust
## 5081               time anticipation
## 5082            prevent         fear
## 5083                ill        anger
## 5084                ill      disgust
## 5085                ill         fear
## 5086                ill     negative
## 5087                ill      sadness
## 5088             brains     positive
## 5089             damage        anger
## 5090             damage      disgust
## 5091             damage     negative
## 5092             damage      sadness
## 5093            nervous anticipation
## 5094            nervous         fear
## 5095            nervous     negative
## 5096             system        trust
## 5097              serve     negative
## 5098              serve        trust
## 5099             chosen     positive
## 5100              godly          joy
## 5101              godly     positive
## 5102              godly        trust
## 5103         impossible     negative
## 5104         impossible      sadness
## 5105              swear     positive
## 5106              swear        trust
## 5107              swear     positive
## 5108              swear        trust
## 5109               gear     positive
## 5110               save          joy
## 5111               save     positive
## 5112               save        trust
## 5113              start anticipation
## 5114         government         fear
## 5115         government     negative
## 5116         population     positive
## 5117              death        anger
## 5118              death anticipation
## 5119              death      disgust
## 5120              death         fear
## 5121              death     negative
## 5122              death      sadness
## 5123              death     surprise
## 5124              march     positive
## 5125               cull     negative
## 5126               food          joy
## 5127               food     positive
## 5128               food        trust
## 5129           shortage        anger
## 5130           shortage         fear
## 5131           shortage     negative
## 5132           shortage      sadness
## 5133               time anticipation
## 5134              death        anger
## 5135              death anticipation
## 5136              death      disgust
## 5137              death         fear
## 5138              death     negative
## 5139              death      sadness
## 5140              death     surprise
## 5141         population     positive
## 5142               land     positive
## 5143               lost     negative
## 5144               lost      sadness
## 5145            skilled     positive
## 5146               sick      disgust
## 5147               sick     negative
## 5148               sick      sadness
## 5149             master     positive
## 5150         completely     positive
## 5151              level     positive
## 5152              level        trust
## 5153            explain     positive
## 5154            explain        trust
## 5155               real     positive
## 5156               real        trust
## 5157           critique     positive
## 5158             author     positive
## 5159             author        trust
## 5160          hypocrite      disgust
## 5161          hypocrite     negative
## 5162             stupid     negative
## 5163             expect anticipation
## 5164             expect     positive
## 5165             expect     surprise
## 5166             expect        trust
## 5167              focus     positive
## 5168               shit        anger
## 5169               shit      disgust
## 5170               shit     negative
## 5171            survive     positive
## 5172               torn     negative
## 5173               shot        anger
## 5174               shot         fear
## 5175               shot     negative
## 5176               shot      sadness
## 5177               shot     surprise
## 5178             vanish     surprise
## 5179               shit        anger
## 5180               shit      disgust
## 5181               shit     negative
## 5182               kill         fear
## 5183               kill     negative
## 5184               kill      sadness
## 5185               shit        anger
## 5186               shit      disgust
## 5187               shit     negative
## 5188               sing anticipation
## 5189               sing          joy
## 5190               sing     positive
## 5191               sing      sadness
## 5192               sing        trust
## 5193            cleanse     positive
## 5194             hatred        anger
## 5195             hatred      disgust
## 5196             hatred         fear
## 5197             hatred     negative
## 5198             hatred      sadness
## 5199          aftermath        anger
## 5200          aftermath      disgust
## 5201          aftermath         fear
## 5202          aftermath     negative
## 5203          aftermath      sadness
## 5204             battle        anger
## 5205             battle     negative
## 5206              cream anticipation
## 5207              cream          joy
## 5208              cream     positive
## 5209              cream     surprise
## 5210            crushed        anger
## 5211            crushed      disgust
## 5212            crushed         fear
## 5213            crushed     negative
## 5214            crushed      sadness
## 5215              silly          joy
## 5216              silly     negative
## 5217         completely     positive
## 5218               land     positive
## 5219               main     positive
## 5220             author     positive
## 5221             author        trust
## 5222           relevant     positive
## 5223           relevant        trust
## 5224               land     positive
## 5225        established          joy
## 5226        established     positive
## 5227         deficiency     negative
## 5228            poverty        anger
## 5229            poverty      disgust
## 5230            poverty         fear
## 5231            poverty     negative
## 5232            poverty      sadness
## 5233              fatty      disgust
## 5234              fatty     negative
## 5235              fatty      sadness
## 5236          destroyed        anger
## 5237          destroyed         fear
## 5238          destroyed     negative
## 5239          destroyed      sadness
## 5240           majority          joy
## 5241           majority     positive
## 5242           majority        trust
## 5243               food          joy
## 5244               food     positive
## 5245               food        trust
## 5246             abject      disgust
## 5247             abject     negative
## 5248            poverty        anger
## 5249            poverty      disgust
## 5250            poverty         fear
## 5251            poverty     negative
## 5252            poverty      sadness
## 5253             lowest     negative
## 5254             lowest      sadness
## 5255              caste     negative
## 5256             choice     positive
## 5257           military         fear
## 5258           preserve     positive
## 5259           military         fear
## 5260            rotting      disgust
## 5261            rotting     negative
## 5262           parasite      disgust
## 5263           parasite         fear
## 5264           parasite     negative
## 5265              laden     negative
## 5266             bottom     negative
## 5267             bottom      sadness
## 5268                pay anticipation
## 5269                pay          joy
## 5270                pay     positive
## 5271                pay        trust
## 5272               nose      disgust
## 5273               lack     negative
## 5274                sun anticipation
## 5275                sun          joy
## 5276                sun     positive
## 5277                sun     surprise
## 5278                sun        trust
## 5279               rule         fear
## 5280               rule        trust
## 5281               cool     positive
## 5282            poverty        anger
## 5283            poverty      disgust
## 5284            poverty         fear
## 5285            poverty     negative
## 5286            poverty      sadness
## 5287             reason     positive
## 5288         population     positive
## 5289               cool     positive
## 5290             tragic     negative
## 5291               cool     positive
## 5292             tragic     negative
## 5293                bad        anger
## 5294                bad      disgust
## 5295                bad         fear
## 5296                bad     negative
## 5297                bad      sadness
## 5298               word     positive
## 5299               word        trust
## 5300               joke     negative
## 5301         deficiency     negative
## 5302               lack     negative
## 5303                sun anticipation
## 5304                sun          joy
## 5305                sun     positive
## 5306                sun     surprise
## 5307                sun        trust
## 5308          oversight     negative
## 5309         deficiency     negative
## 5310           horrific        anger
## 5311           horrific      disgust
## 5312           horrific         fear
## 5313           horrific     negative
## 5314           horrific      sadness
## 5315           sickness      disgust
## 5316           sickness         fear
## 5317           sickness     negative
## 5318           sickness      sadness
## 5319          destroyed        anger
## 5320          destroyed         fear
## 5321          destroyed     negative
## 5322          destroyed      sadness
## 5323         deficiency     negative
## 5324             author     positive
## 5325             author        trust
## 5326              waste      disgust
## 5327              waste     negative
## 5328             larger      disgust
## 5329             larger     surprise
## 5330             larger        trust
## 5331         population     positive
## 5332             author     positive
## 5333             author        trust
## 5334              track anticipation
## 5335             expect anticipation
## 5336             expect     positive
## 5337             expect     surprise
## 5338             expect        trust
## 5339              track anticipation
## 5340              flesh      disgust
## 5341              flesh      disgust
## 5342               food          joy
## 5343               food     positive
## 5344               food        trust
## 5345              happy anticipation
## 5346              happy          joy
## 5347              happy     positive
## 5348              happy        trust
## 5349          destroyed        anger
## 5350          destroyed         fear
## 5351          destroyed     negative
## 5352          destroyed      sadness
## 5353             attack        anger
## 5354             attack         fear
## 5355             attack     negative
## 5356             giving     positive
## 5357             credit     positive
## 5358             credit        trust
## 5359             theory anticipation
## 5360             theory        trust
## 5361              birth anticipation
## 5362              birth         fear
## 5363              birth          joy
## 5364              birth     positive
## 5365              birth        trust
## 5366               joke     negative
## 5367             theory anticipation
## 5368             theory        trust
## 5369              birth anticipation
## 5370              birth         fear
## 5371              birth          joy
## 5372              birth     positive
## 5373              birth        trust
## 5374            special          joy
## 5375            special     positive
## 5376               time anticipation
## 5377                wit     positive
## 5378              extra     positive
## 5379             effort     positive
## 5380            include     positive
## 5381               time anticipation
## 5382        coincidence     surprise
## 5383               land     positive
## 5384          including     positive
## 5385            fertile     positive
## 5386            knowing     positive
## 5387                die         fear
## 5388                die     negative
## 5389                die      sadness
## 5390            dispute        anger
## 5391            dispute     negative
## 5392                die         fear
## 5393                die     negative
## 5394                die      sadness
## 5395              peace anticipation
## 5396              peace          joy
## 5397              peace     positive
## 5398              peace        trust
## 5399          influence     negative
## 5400          influence     positive
## 5401          lamenting      sadness
## 5402              build     positive
## 5403             suffer     negative
## 5404                die         fear
## 5405                die     negative
## 5406                die      sadness
## 5407        immediately anticipation
## 5408        immediately     negative
## 5409        immediately     positive
## 5410             cancer        anger
## 5411             cancer      disgust
## 5412             cancer         fear
## 5413             cancer     negative
## 5414             cancer      sadness
## 5415              agree     positive
## 5416             absurd     negative
## 5417             theory anticipation
## 5418             theory        trust
## 5419         scientific     positive
## 5420         scientific        trust
## 5421               love          joy
## 5422               love     positive
## 5423          destroyed        anger
## 5424          destroyed         fear
## 5425          destroyed     negative
## 5426          destroyed      sadness
## 5427               shot        anger
## 5428               shot         fear
## 5429               shot     negative
## 5430               shot      sadness
## 5431               shot     surprise
## 5432               shot        anger
## 5433               shot         fear
## 5434               shot     negative
## 5435               shot      sadness
## 5436               shot     surprise
## 5437             result anticipation
## 5438             daring     positive
## 5439           question     positive
## 5440               kill         fear
## 5441               kill     negative
## 5442               kill      sadness
## 5443         cultivated     positive
## 5444               farm anticipation
## 5445               wait anticipation
## 5446               wait     negative
## 5447           strength     positive
## 5448           strength        trust
## 5449               land     positive
## 5450               grow anticipation
## 5451               grow          joy
## 5452               grow     positive
## 5453               grow        trust
## 5454             result anticipation
## 5455           majority          joy
## 5456           majority     positive
## 5457           majority        trust
## 5458          destroyed        anger
## 5459          destroyed         fear
## 5460          destroyed     negative
## 5461          destroyed      sadness
## 5462           secluded     negative
## 5463           secluded      sadness
## 5464               fair     positive
## 5465              giant         fear
## 5466          influence     negative
## 5467          influence     positive
## 5468         manipulate     negative
## 5469              build     positive
## 5470               king     positive
## 5471          cultivate anticipation
## 5472          cultivate     positive
## 5473          cultivate        trust
## 5474            develop anticipation
## 5475            develop     positive
## 5476          destroyed        anger
## 5477          destroyed         fear
## 5478          destroyed     negative
## 5479          destroyed      sadness
## 5480          challenge        anger
## 5481          challenge         fear
## 5482          challenge     negative
## 5483              guess     surprise
## 5484               land     positive
## 5485               soil      disgust
## 5486               soil     negative
## 5487              leave     negative
## 5488              leave      sadness
## 5489              leave     surprise
## 5490             barren     negative
## 5491             barren      sadness
## 5492         cultivated     positive
## 5493            perfect anticipation
## 5494            perfect          joy
## 5495            perfect     positive
## 5496            perfect        trust
## 5497               land     positive
## 5498          destroyed        anger
## 5499          destroyed         fear
## 5500          destroyed     negative
## 5501          destroyed      sadness
## 5502             absurd     negative
## 5503             theory anticipation
## 5504             theory        trust
## 5505               plan anticipation
## 5506              lying        anger
## 5507              lying      disgust
## 5508              lying     negative
## 5509               land     positive
## 5510          destroyed        anger
## 5511          destroyed         fear
## 5512          destroyed     negative
## 5513          destroyed      sadness
## 5514         completely     positive
## 5515            moronic     negative
## 5516            lunatic        anger
## 5517            lunatic      disgust
## 5518            lunatic         fear
## 5519            lunatic     negative
## 5520              avoid         fear
## 5521              avoid     negative
## 5522             detect     positive
## 5523              words        anger
## 5524              words     negative
## 5525               kill         fear
## 5526               kill     negative
## 5527               kill      sadness
## 5528            precise     positive
## 5529             damage        anger
## 5530             damage      disgust
## 5531             damage     negative
## 5532             damage      sadness
## 5533             larger      disgust
## 5534             larger     surprise
## 5535             larger        trust
## 5536               kill         fear
## 5537               kill     negative
## 5538               kill      sadness
## 5539            account        trust
## 5540              agree     positive
## 5541             absurd     negative
## 5542             theory anticipation
## 5543             theory        trust
## 5544           peaceful anticipation
## 5545           peaceful          joy
## 5546           peaceful     positive
## 5547           peaceful     surprise
## 5548           peaceful        trust
## 5549             theory anticipation
## 5550             theory        trust
## 5551            account        trust
## 5552          diplomacy anticipation
## 5553          diplomacy     positive
## 5554          diplomacy        trust
## 5555           imminent anticipation
## 5556           imminent         fear
## 5557             attack        anger
## 5558             attack         fear
## 5559             attack     negative
## 5560              start anticipation
## 5561                war         fear
## 5562                war     negative
## 5563             attack        anger
## 5564             attack         fear
## 5565             attack     negative
## 5566              worse         fear
## 5567              worse     negative
## 5568              worse      sadness
## 5569            knowing     positive
## 5570               fits        anger
## 5571               fits     negative
## 5572          destroyed        anger
## 5573          destroyed         fear
## 5574          destroyed     negative
## 5575          destroyed      sadness
## 5576           humanity          joy
## 5577           humanity     positive
## 5578           humanity        trust
## 5579         technology     positive
## 5580             chance     surprise
## 5581               shit        anger
## 5582               shit      disgust
## 5583               shit     negative
## 5584            develop anticipation
## 5585            develop     positive
## 5586               cold     negative
## 5587                war         fear
## 5588                war     negative
## 5589         destroying        anger
## 5590         destroying         fear
## 5591         destroying     negative
## 5592         destroying      sadness
## 5593               deal anticipation
## 5594               deal          joy
## 5595               deal     positive
## 5596               deal     surprise
## 5597               deal        trust
## 5598               risk anticipation
## 5599               risk         fear
## 5600               risk     negative
## 5601               deal anticipation
## 5602               deal          joy
## 5603               deal     positive
## 5604               deal     surprise
## 5605               deal        trust
## 5606              peace anticipation
## 5607              peace          joy
## 5608              peace     positive
## 5609              peace        trust
## 5610              peace anticipation
## 5611              peace          joy
## 5612              peace     positive
## 5613              peace        trust
## 5614               real     positive
## 5615               real        trust
## 5616               shit        anger
## 5617               shit      disgust
## 5618               shit     negative
## 5619             nation        trust
## 5620         technology     positive
## 5621            develop anticipation
## 5622            develop     positive
## 5623               time anticipation
## 5624          scientist anticipation
## 5625          scientist     positive
## 5626          scientist        trust
## 5627               atom     positive
## 5628          destroyed        anger
## 5629          destroyed         fear
## 5630          destroyed     negative
## 5631          destroyed      sadness
## 5632             change         fear
## 5633               real     positive
## 5634               real        trust
## 5635          destroyed        anger
## 5636          destroyed         fear
## 5637          destroyed     negative
## 5638          destroyed      sadness
## 5639            careful     positive
## 5640               deal anticipation
## 5641               deal          joy
## 5642               deal     positive
## 5643               deal     surprise
## 5644               deal        trust
## 5645             damage        anger
## 5646             damage      disgust
## 5647             damage     negative
## 5648             damage      sadness
## 5649         manipulate     negative
## 5650             create          joy
## 5651             create     positive
## 5652         manipulate     negative
## 5653              adapt     positive
## 5654               kill         fear
## 5655               kill     negative
## 5656               kill      sadness
## 5657          destroyed        anger
## 5658          destroyed         fear
## 5659          destroyed     negative
## 5660          destroyed      sadness
## 5661             mutual     positive
## 5662                mad        anger
## 5663                mad      disgust
## 5664                mad         fear
## 5665                mad     negative
## 5666                mad      sadness
## 5667              agree     positive
## 5668          destroyed        anger
## 5669          destroyed         fear
## 5670          destroyed     negative
## 5671          destroyed      sadness
## 5672              avoid         fear
## 5673              avoid     negative
## 5674             happen anticipation
## 5675         manipulate     negative
## 5676            related        trust
## 5677               true          joy
## 5678               true     positive
## 5679               true        trust
## 5680             ground        trust
## 5681               kill         fear
## 5682               kill     negative
## 5683               kill      sadness
## 5684               worm anticipation
## 5685               worm     negative
## 5686               worm     surprise
## 5687           colossal     positive
## 5688             create          joy
## 5689             create     positive
## 5690             create          joy
## 5691             create     positive
## 5692             reason     positive
## 5693            related        trust
## 5694               dirt      disgust
## 5695               dirt     negative
## 5696         manipulate     negative
## 5697               king     positive
## 5698              build     positive
## 5699         manipulate     negative
## 5700            related        trust
## 5701               fell     negative
## 5702               fell      sadness
## 5703              catch     surprise
## 5704               fire         fear
## 5705           reliable     positive
## 5706           reliable        trust
## 5707         prosperity     positive
## 5708               land     positive
## 5709             horror        anger
## 5710             horror      disgust
## 5711             horror         fear
## 5712             horror     negative
## 5713             horror      sadness
## 5714             horror     surprise
## 5715              guess     surprise
## 5716         manipulate     negative
## 5717              flesh      disgust
## 5718               true          joy
## 5719               true     positive
## 5720               true        trust
## 5721               true          joy
## 5722               true     positive
## 5723               true        trust
## 5724               deal anticipation
## 5725               deal          joy
## 5726               deal     positive
## 5727               deal     surprise
## 5728               deal        trust
## 5729              devil        anger
## 5730              devil anticipation
## 5731              devil      disgust
## 5732              devil         fear
## 5733              devil     negative
## 5734              devil      sadness
## 5735         prosperity     positive
## 5736               land     positive
## 5737              build     positive
## 5738         manipulate     negative
## 5739              flesh      disgust
## 5740              serve     negative
## 5741              serve        trust
## 5742              flesh      disgust
## 5743              serve     negative
## 5744              serve        trust
## 5745               rest     positive
## 5746                fun anticipation
## 5747                fun          joy
## 5748                fun     positive
## 5749               real     positive
## 5750               real        trust
## 5751             author     positive
## 5752             author        trust
## 5753         population     positive
## 5754             growth     positive
## 5755             harbor        trust
## 5756              doubt         fear
## 5757              doubt     negative
## 5758              doubt      sadness
## 5759              doubt        trust
## 5760         disastrous        anger
## 5761         disastrous         fear
## 5762         disastrous     negative
## 5763         disastrous      sadness
## 5764               kill         fear
## 5765               kill     negative
## 5766               kill      sadness
## 5767           alliance        trust
## 5768             giving     positive
## 5769              adapt     positive
## 5770           alliance        trust
## 5771               kill         fear
## 5772               kill     negative
## 5773               kill      sadness
## 5774              flesh      disgust
## 5775             giving     positive
## 5776                job     positive
## 5777             giving     positive
## 5778                job     positive
## 5779               food          joy
## 5780               food     positive
## 5781               food        trust
## 5782                hot        anger
## 5783         physiology     positive
## 5784              shame      disgust
## 5785              shame         fear
## 5786              shame     negative
## 5787              shame      sadness
## 5788         impervious     positive
## 5789             damage        anger
## 5790             damage      disgust
## 5791             damage     negative
## 5792             damage      sadness
## 5793        established          joy
## 5794        established     positive
## 5795          unlimited     positive
## 5796          influence     negative
## 5797          influence     positive
## 5798            ability     positive
## 5799                vow anticipation
## 5800                vow          joy
## 5801                vow     positive
## 5802                vow        trust
## 5803              peace anticipation
## 5804              peace          joy
## 5805              peace     positive
## 5806              peace        trust
## 5807            enhance     positive
## 5808               risk anticipation
## 5809               risk         fear
## 5810               risk     negative
## 5811              civil     positive
## 5812                war         fear
## 5813                war     negative
## 5814              argue        anger
## 5815              argue     negative
## 5816                war         fear
## 5817                war     negative
## 5818           absolute     positive
## 5819           strength     positive
## 5820           strength        trust
## 5821             reason     positive
## 5822               time anticipation
## 5823             change         fear
## 5824             unable     negative
## 5825             unable      sadness
## 5826              argue        anger
## 5827              argue     negative
## 5828         impossible     negative
## 5829         impossible      sadness
## 5830               king     positive
## 5831            disease        anger
## 5832            disease      disgust
## 5833            disease         fear
## 5834            disease     negative
## 5835            disease      sadness
## 5836              sense     positive
## 5837               king     positive
## 5838         oppressive        anger
## 5839         oppressive      disgust
## 5840         oppressive         fear
## 5841         oppressive     negative
## 5842         oppressive      sadness
## 5843             nation        trust
## 5844             honest        anger
## 5845             honest      disgust
## 5846             honest         fear
## 5847             honest          joy
## 5848             honest     positive
## 5849             honest      sadness
## 5850             honest        trust
## 5851             stupid     negative
## 5852              civil     positive
## 5853                war         fear
## 5854                war     negative
## 5855           immortal     positive
## 5856              start anticipation
## 5857               defy        anger
## 5858               defy         fear
## 5859               defy     negative
## 5860               defy      sadness
## 5861               defy     surprise
## 5862           preserve     positive
## 5863              peace anticipation
## 5864              peace          joy
## 5865              peace     positive
## 5866              peace        trust
## 5867            winning anticipation
## 5868            winning      disgust
## 5869            winning          joy
## 5870            winning     positive
## 5871            winning      sadness
## 5872            winning     surprise
## 5873            winning        trust
## 5874                war         fear
## 5875                war     negative
## 5876              strip     negative
## 5877              strip      sadness
## 5878               kill         fear
## 5879               kill     negative
## 5880               kill      sadness
## 5881           alliance        trust
## 5882               kill         fear
## 5883               kill     negative
## 5884               kill      sadness
## 5885            freedom          joy
## 5886            freedom     positive
## 5887            freedom        trust
## 5888             remove        anger
## 5889             remove         fear
## 5890             remove     negative
## 5891             remove      sadness
## 5892           confront        anger
## 5893          merciless         fear
## 5894          merciless     negative
## 5895              fleet     positive
## 5896           colossal     positive
## 5897               kill         fear
## 5898               kill     negative
## 5899               kill      sadness
## 5900              happy anticipation
## 5901              happy          joy
## 5902              happy     positive
## 5903              happy        trust
## 5904           defeated     negative
## 5905           defeated      sadness
## 5906           alliance        trust
## 5907       manipulation        anger
## 5908       manipulation         fear
## 5909       manipulation     negative
## 5910               soil      disgust
## 5911               soil     negative
## 5912              crazy        anger
## 5913              crazy         fear
## 5914              crazy     negative
## 5915              crazy      sadness
## 5916          influence     negative
## 5917          influence     positive
## 5918             church anticipation
## 5919             church          joy
## 5920             church     positive
## 5921             church        trust
## 5922                ass     negative
## 5923              stone        anger
## 5924              stone     negative
## 5925               dirt      disgust
## 5926               dirt     negative
## 5927            forming anticipation
## 5928              sense     positive
## 5929               real     positive
## 5930               real        trust
## 5931              proof        trust
## 5932             theory anticipation
## 5933             theory        trust
## 5934              guess     surprise
## 5935          supported     positive
## 5936              stone        anger
## 5937              stone     negative
## 5938              proof        trust
## 5939             coming anticipation
## 5940               tree        anger
## 5941               tree anticipation
## 5942               tree      disgust
## 5943               tree          joy
## 5944               tree     positive
## 5945               tree     surprise
## 5946               tree        trust
## 5947       manipulation        anger
## 5948       manipulation         fear
## 5949       manipulation     negative
## 5950         manipulate     negative
## 5951              level     positive
## 5952              level        trust
## 5953         manipulate     negative
## 5954             unique     positive
## 5955             unique     surprise
## 5956               gear     positive
## 5957              sense     positive
## 5958               fair     positive
## 5959         manipulate     negative
## 5960        established          joy
## 5961        established     positive
## 5962              armor         fear
## 5963              armor     positive
## 5964              armor        trust
## 5965               jaws         fear
## 5966               fair     positive
## 5967         completely     positive
## 5968           deformed      disgust
## 5969           deformed     negative
## 5970           deformed      sadness
## 5971               tree        anger
## 5972               tree anticipation
## 5973               tree      disgust
## 5974               tree          joy
## 5975               tree     positive
## 5976               tree     surprise
## 5977               tree        trust
## 5978              giant         fear
## 5979         manipulate     negative
## 5980              build     positive
## 5981            related        trust
## 5982              build     positive
## 5983            exposed     negative
## 5984           freezing     negative
## 5985              found          joy
## 5986              found     positive
## 5987              found        trust
## 5988          explosion         fear
## 5989          explosion     negative
## 5990          explosion     surprise
## 5991           official        trust
## 5992               fall     negative
## 5993               fall      sadness
## 5994           reliable     positive
## 5995           reliable        trust
## 5996              guide     positive
## 5997              guide        trust
## 5998           official        trust
## 5999              sense     positive
## 6000          carefully     positive
## 6001              sense     positive
## 6002               fair     positive
## 6003         manipulate     negative
## 6004               blue      sadness
## 6005         manipulate     negative
## 6006             create          joy
## 6007             create     positive
## 6008              stone        anger
## 6009              stone     negative
## 6010             create          joy
## 6011             create     positive
## 6012              stone        anger
## 6013              stone     negative
## 6014        established          joy
## 6015        established     positive
## 6016              armor         fear
## 6017              armor     positive
## 6018              armor        trust
## 6019               jaws         fear
## 6020               blue      sadness
## 6021               fair     positive
## 6022         completely     positive
## 6023           deformed      disgust
## 6024           deformed     negative
## 6025           deformed      sadness
## 6026               tree        anger
## 6027               tree anticipation
## 6028               tree      disgust
## 6029               tree          joy
## 6030               tree     positive
## 6031               tree     surprise
## 6032               tree        trust
## 6033              giant         fear
## 6034         manipulate     negative
## 6035              build     positive
## 6036            related        trust
## 6037              build     positive
## 6038             writer     positive
## 6039               fill        trust
## 6040            exposed     negative
## 6041           freezing     negative
## 6042              found          joy
## 6043              found     positive
## 6044              found        trust
## 6045          explosion         fear
## 6046          explosion     negative
## 6047          explosion     surprise
## 6048           official        trust
## 6049               fall     negative
## 6050               fall      sadness
## 6051           reliable     positive
## 6052           reliable        trust
## 6053              guide     positive
## 6054              guide        trust
## 6055           official        trust
## 6056              sense     positive
## 6057          carefully     positive
## 6058             pretty anticipation
## 6059             pretty          joy
## 6060             pretty     positive
## 6061             pretty        trust
## 6062               king     positive
## 6063            reading     positive
## 6064           reliable     positive
## 6065           reliable        trust
## 6066              stone        anger
## 6067              stone     negative
## 6068              stone        anger
## 6069              stone     negative
## 6070              shape     positive
## 6071              stone        anger
## 6072              stone     negative
## 6073           hardness     negative
## 6074              armor         fear
## 6075              armor     positive
## 6076              armor        trust
## 6077           hardened        anger
## 6078           hardened      disgust
## 6079           hardened         fear
## 6080           hardened     negative
## 6081               blue      sadness
## 6082               dark      sadness
## 6083               blue      sadness
## 6084         constantly        trust
## 6085            exposed     negative
## 6086         completely     positive
## 6087              armor         fear
## 6088              armor     positive
## 6089              armor        trust
## 6090               blue      sadness
## 6091               true          joy
## 6092               true     positive
## 6093               true        trust
## 6094              sense     positive
## 6095              stone        anger
## 6096              stone     negative
## 6097              stone        anger
## 6098              stone     negative
## 6099            logical     positive
## 6100              sense     positive
## 6101              stone        anger
## 6102              stone     negative
## 6103        speculation         fear
## 6104        speculation     negative
## 6105        speculation      sadness
## 6106            machine        trust
## 6107               time anticipation
## 6108         constantly        trust
## 6109        speculation         fear
## 6110        speculation     negative
## 6111        speculation      sadness
## 6112             debate     positive
## 6113              stone        anger
## 6114              stone     negative
## 6115              giant         fear
## 6116              stone        anger
## 6117              stone     negative
## 6118              break     surprise
## 6119         constantly        trust
## 6120               food          joy
## 6121               food     positive
## 6122               food        trust
## 6123           building     positive
## 6124              force        anger
## 6125              force         fear
## 6126              force     negative
## 6127         completely     positive
## 6128             change         fear
## 6129               land     positive
## 6130            perfect anticipation
## 6131            perfect          joy
## 6132            perfect     positive
## 6133            perfect        trust
## 6134             litter     negative
## 6135         constantly        trust
## 6136           argument        anger
## 6137           argument     negative
## 6138             forget     negative
## 6139                don     positive
## 6140                don        trust
## 6141               shit        anger
## 6142               shit      disgust
## 6143               shit     negative
## 6144                don     positive
## 6145                don        trust
## 6146        unbreakable     positive
## 6147             change         fear
## 6148             change         fear
## 6149              adapt     positive
## 6150               king     positive
## 6151            disease        anger
## 6152            disease      disgust
## 6153            disease         fear
## 6154            disease     negative
## 6155            disease      sadness
## 6156            amnesia     negative
## 6157            survive     positive
## 6158                ass     negative
## 6159             forced         fear
## 6160             forced     negative
## 6161             happen anticipation
## 6162              proof        trust
## 6163              proof        trust
## 6164               safe          joy
## 6165               safe     positive
## 6166               safe        trust
## 6167                bad        anger
## 6168                bad      disgust
## 6169                bad         fear
## 6170                bad     negative
## 6171                bad      sadness
## 6172               bomb        anger
## 6173               bomb         fear
## 6174               bomb     negative
## 6175               bomb      sadness
## 6176               bomb     surprise
## 6177              proof        trust
## 6178               bomb        anger
## 6179               bomb         fear
## 6180               bomb     negative
## 6181               bomb      sadness
## 6182               bomb     surprise
## 6183              proof        trust
## 6184                bad        anger
## 6185                bad      disgust
## 6186                bad         fear
## 6187                bad     negative
## 6188                bad      sadness
## 6189               bomb        anger
## 6190               bomb         fear
## 6191               bomb     negative
## 6192               bomb      sadness
## 6193               bomb     surprise
## 6194              proof        trust
## 6195          forgotten         fear
## 6196          forgotten     negative
## 6197          forgotten      sadness
## 6198               bomb        anger
## 6199               bomb         fear
## 6200               bomb     negative
## 6201               bomb      sadness
## 6202               bomb     surprise
## 6203              proof        trust
## 6204           collapse      disgust
## 6205           collapse         fear
## 6206           collapse     negative
## 6207           collapse      sadness
## 6208          resistant         fear
## 6209          resistant     negative
## 6210         protecting     positive
## 6211         protecting        trust
## 6212           collapse      disgust
## 6213           collapse         fear
## 6214           collapse     negative
## 6215           collapse      sadness
## 6216             proper     positive
## 6217                top anticipation
## 6218                top     positive
## 6219                top        trust
## 6220             pretty anticipation
## 6221             pretty          joy
## 6222             pretty     positive
## 6223             pretty        trust
## 6224               fair     positive
## 6225              wrong     negative
## 6226           superior     positive
## 6227           immortal     positive
## 6228             hatred        anger
## 6229             hatred      disgust
## 6230             hatred         fear
## 6231             hatred     negative
## 6232             hatred      sadness
## 6233           conflict        anger
## 6234           conflict         fear
## 6235           conflict     negative
## 6236           conflict      sadness
## 6237               kill         fear
## 6238               kill     negative
## 6239               kill      sadness
## 6240         completely     positive
## 6241              erase         fear
## 6242              erase     negative
## 6243              start anticipation
## 6244            outcome     positive
## 6245               joke     negative
## 6246               dumb     negative
## 6247          statement     positive
## 6248          statement        trust
## 6249                god anticipation
## 6250                god         fear
## 6251                god          joy
## 6252                god     positive
## 6253                god        trust
## 6254               damn        anger
## 6255               damn      disgust
## 6256               damn     negative
## 6257             marvel     positive
## 6258             marvel     surprise
## 6259             change         fear
## 6260              adapt     positive
## 6261           doomsday        anger
## 6262           doomsday anticipation
## 6263           doomsday      disgust
## 6264           doomsday         fear
## 6265           doomsday     negative
## 6266           doomsday      sadness
## 6267           superman          joy
## 6268           superman     positive
## 6269           superman        trust
## 6270           standing     positive
## 6271        advancement     positive
## 6272             leader     positive
## 6273             leader        trust
## 6274              prove     positive
## 6275              wrong     negative
## 6276           argument        anger
## 6277           argument     negative
## 6278           defender     positive
## 6279           defender        trust
## 6280         completely     positive
## 6281               kiss anticipation
## 6282               kiss          joy
## 6283               kiss     positive
## 6284               kiss     surprise
## 6285            praised          joy
## 6286            praised     positive
## 6287             praise          joy
## 6288             praise     positive
## 6289             praise        trust
## 6290               kiss anticipation
## 6291               kiss          joy
## 6292               kiss     positive
## 6293               kiss     surprise
## 6294           alliance        trust
## 6295               hate        anger
## 6296               hate      disgust
## 6297               hate         fear
## 6298               hate     negative
## 6299               hate      sadness
## 6300              guilt      disgust
## 6301              guilt     negative
## 6302              guilt      sadness
## 6303             defend         fear
## 6304             defend     positive
## 6305                bad        anger
## 6306                bad      disgust
## 6307                bad         fear
## 6308                bad     negative
## 6309                bad      sadness
## 6310              force        anger
## 6311              force         fear
## 6312              force     negative
## 6313          diplomacy anticipation
## 6314          diplomacy     positive
## 6315          diplomacy        trust
## 6316        possibility anticipation
## 6317             attack        anger
## 6318             attack         fear
## 6319             attack     negative
## 6320            killing        anger
## 6321            killing         fear
## 6322            killing     negative
## 6323            killing      sadness
## 6324               kiss anticipation
## 6325               kiss          joy
## 6326               kiss     positive
## 6327               kiss     surprise
## 6328                hug          joy
## 6329                hug     positive
## 6330                hug        trust
## 6331             flying         fear
## 6332             flying     positive
## 6333            freedom          joy
## 6334            freedom     positive
## 6335            freedom        trust
## 6336             remove        anger
## 6337             remove         fear
## 6338             remove     negative
## 6339             remove      sadness
## 6340             poorly     negative
## 6341          chocolate anticipation
## 6342          chocolate          joy
## 6343          chocolate     positive
## 6344          chocolate        trust
## 6345               shit        anger
## 6346               shit      disgust
## 6347               shit     negative
## 6348                hug          joy
## 6349                hug     positive
## 6350                hug        trust
## 6351          corporeal     positive
## 6352           daughter          joy
## 6353           daughter     positive
## 6354               real     positive
## 6355               real        trust
## 6356           daughter          joy
## 6357           daughter     positive
## 6358             reason     positive
## 6359             tragic     negative
## 6360            freedom          joy
## 6361            freedom     positive
## 6362            freedom        trust
## 6363               rock     positive
## 6364               rock     positive
## 6365             poison        anger
## 6366             poison      disgust
## 6367             poison         fear
## 6368             poison     negative
## 6369             poison      sadness
## 6370        unconscious     negative
## 6371               gore        anger
## 6372               gore      disgust
## 6373               gore         fear
## 6374               gore     negative
## 6375               gore      sadness
## 6376             attack        anger
## 6377             attack         fear
## 6378             attack     negative
## 6379              cross        anger
## 6380              cross         fear
## 6381              cross     negative
## 6382              cross      sadness
## 6383              shape     positive
## 6384              level     positive
## 6385              level        trust
## 6386           alliance        trust
## 6387            victory anticipation
## 6388            victory          joy
## 6389            victory     positive
## 6390            victory        trust
## 6391         ridiculous        anger
## 6392         ridiculous      disgust
## 6393         ridiculous     negative
## 6394             losing        anger
## 6395             losing     negative
## 6396             losing      sadness
## 6397            monster         fear
## 6398            monster     negative
## 6399                god anticipation
## 6400                god         fear
## 6401                god          joy
## 6402                god     positive
## 6403                god        trust
## 6404          infection         fear
## 6405          infection     negative
## 6406               cool     positive
## 6407             prefer     positive
## 6408             prefer        trust
## 6409               risk anticipation
## 6410               risk         fear
## 6411               risk     negative
## 6412              guess     surprise
## 6413             happen anticipation
## 6414          destroyed        anger
## 6415          destroyed         fear
## 6416          destroyed     negative
## 6417          destroyed      sadness
## 6418               real     positive
## 6419               real        trust
## 6420               real     positive
## 6421               real        trust
## 6422               gear     positive
## 6423                die         fear
## 6424                die     negative
## 6425                die      sadness
## 6426              leave     negative
## 6427              leave      sadness
## 6428              leave     surprise
## 6429            account        trust
## 6430           terrible        anger
## 6431           terrible      disgust
## 6432           terrible         fear
## 6433           terrible     negative
## 6434           terrible      sadness
## 6435         completing anticipation
## 6436         completing          joy
## 6437         completing     positive
## 6438               real     positive
## 6439               real        trust
## 6440             theory anticipation
## 6441             theory        trust
## 6442               kill         fear
## 6443               kill     negative
## 6444               kill      sadness
## 6445           alliance        trust
## 6446             theory anticipation
## 6447             theory        trust
## 6448             theory anticipation
## 6449             theory        trust
## 6450              watch anticipation
## 6451              watch         fear
## 6452             reason     positive
## 6453             garden          joy
## 6454             garden     positive
## 6455             theory anticipation
## 6456             theory        trust
## 6457         importance anticipation
## 6458         importance     positive
## 6459                don     positive
## 6460                don        trust
## 6461             theory anticipation
## 6462             theory        trust
## 6463             motion anticipation
## 6464         importance anticipation
## 6465         importance     positive
## 6466              green          joy
## 6467              green     positive
## 6468              green        trust
## 6469              agree     positive
## 6470        interrupted     negative
## 6471        interrupted      sadness
## 6472            include     positive
## 6473             reason     positive
## 6474              argue        anger
## 6475              argue     negative
## 6476                wit     positive
## 6477             theory anticipation
## 6478             theory        trust
## 6479          destroyed        anger
## 6480          destroyed         fear
## 6481          destroyed     negative
## 6482          destroyed      sadness
## 6483               time anticipation
## 6484             create          joy
## 6485             create     positive
## 6486               time anticipation
## 6487               true          joy
## 6488               true     positive
## 6489               true        trust
## 6490             theory anticipation
## 6491             theory        trust
## 6492                don     positive
## 6493                don        trust
## 6494               grow anticipation
## 6495               grow          joy
## 6496               grow     positive
## 6497               grow        trust
## 6498                top anticipation
## 6499                top     positive
## 6500                top        trust
## 6501               grow anticipation
## 6502               grow          joy
## 6503               grow     positive
## 6504               grow        trust
## 6505               true          joy
## 6506               true     positive
## 6507               true        trust
## 6508               cool     positive
## 6509               kill         fear
## 6510               kill     negative
## 6511               kill      sadness
## 6512           alliance        trust
## 6513             choice     positive
## 6514           alliance        trust
## 6515               kill         fear
## 6516               kill     negative
## 6517               kill      sadness
## 6518                die         fear
## 6519                die     negative
## 6520                die      sadness
## 6521              curse        anger
## 6522              curse      disgust
## 6523              curse         fear
## 6524              curse     negative
## 6525              curse      sadness
## 6526             option     positive
## 6527             choice     positive
## 6528             choice     positive
## 6529              curse        anger
## 6530              curse      disgust
## 6531              curse         fear
## 6532              curse     negative
## 6533              curse      sadness
## 6534               kill         fear
## 6535               kill     negative
## 6536               kill      sadness
## 6537              curse        anger
## 6538              curse      disgust
## 6539              curse         fear
## 6540              curse     negative
## 6541              curse      sadness
## 6542             pretty anticipation
## 6543             pretty          joy
## 6544             pretty     positive
## 6545             pretty        trust
## 6546                bad        anger
## 6547                bad      disgust
## 6548                bad         fear
## 6549                bad     negative
## 6550                bad      sadness
## 6551               kill         fear
## 6552               kill     negative
## 6553               kill      sadness
## 6554              guess     surprise
## 6555               grow anticipation
## 6556               grow          joy
## 6557               grow     positive
## 6558               grow        trust
## 6559           colossal     positive
## 6560               land     positive
## 6561               hide         fear
## 6562          destroyed        anger
## 6563          destroyed         fear
## 6564          destroyed     negative
## 6565          destroyed      sadness
## 6566               rest     positive
## 6567           immature anticipation
## 6568           immature     negative
## 6569          surprised     surprise
## 6570                hit        anger
## 6571                hit     negative
## 6572         population     positive
## 6573               kill         fear
## 6574               kill     negative
## 6575               kill      sadness
## 6576                hit        anger
## 6577                hit     negative
## 6578              split     negative
## 6579           colossal     positive
## 6580             forced         fear
## 6581             forced     negative
## 6582         constantly        trust
## 6583             hunter anticipation
## 6584             hunter         fear
## 6585             hunter     negative
## 6586             hunter      sadness
## 6587            ability     positive
## 6588         resistance        anger
## 6589         resistance     negative
## 6590           organize     positive
## 6591             relief     positive
## 6592             assist     positive
## 6593             assist        trust
## 6594           argument        anger
## 6595           argument     negative
## 6596               fair     positive
## 6597      understanding     positive
## 6598      understanding        trust
## 6599             change         fear
## 6600             reason     positive
## 6601               time anticipation
## 6602               save          joy
## 6603               save     positive
## 6604               save        trust
## 6605             suffer     negative
## 6606             bombed      disgust
## 6607             bombed     negative
## 6608              dying        anger
## 6609              dying      disgust
## 6610              dying         fear
## 6611              dying     negative
## 6612              dying      sadness
## 6613           defeated     negative
## 6614           defeated      sadness
## 6615             losing        anger
## 6616             losing     negative
## 6617             losing      sadness
## 6618         confidence         fear
## 6619         confidence          joy
## 6620         confidence     positive
## 6621         confidence        trust
## 6622            ability     positive
## 6623           argument        anger
## 6624           argument     negative
## 6625               land     positive
## 6626          destroyed        anger
## 6627          destroyed         fear
## 6628          destroyed     negative
## 6629          destroyed      sadness
## 6630         production anticipation
## 6631         production     positive
## 6632          destroyed        anger
## 6633          destroyed         fear
## 6634          destroyed     negative
## 6635          destroyed      sadness
## 6636             rising anticipation
## 6637             rising          joy
## 6638             rising     positive
## 6639               land     positive
## 6640          producing     positive
## 6641              death        anger
## 6642              death anticipation
## 6643              death      disgust
## 6644              death         fear
## 6645              death     negative
## 6646              death      sadness
## 6647              death     surprise
## 6648             growth     positive
## 6649               land     positive
## 6650          destroyed        anger
## 6651          destroyed         fear
## 6652          destroyed     negative
## 6653          destroyed      sadness
## 6654         production anticipation
## 6655         production     positive
## 6656          destroyed        anger
## 6657          destroyed         fear
## 6658          destroyed     negative
## 6659          destroyed      sadness
## 6660               hope anticipation
## 6661               hope          joy
## 6662               hope     positive
## 6663               hope     surprise
## 6664               hope        trust
## 6665             rising anticipation
## 6666             rising          joy
## 6667             rising     positive
## 6668               acid     negative
## 6669               dumb     negative
## 6670               grow anticipation
## 6671               grow          joy
## 6672               grow     positive
## 6673               grow        trust
## 6674             growth     positive
## 6675                war         fear
## 6676                war     negative
## 6677               heal          joy
## 6678               heal     positive
## 6679               heal        trust
## 6680                war         fear
## 6681                war     negative
## 6682               ruin         fear
## 6683               ruin     negative
## 6684               ruin      sadness
## 6685                don     positive
## 6686                don        trust
## 6687            predict anticipation
## 6688             happen anticipation
## 6689            freedom          joy
## 6690            freedom     positive
## 6691            freedom        trust
## 6692            brother     positive
## 6693            brother        trust
## 6694               real     positive
## 6695               real        trust
## 6696           doomsday        anger
## 6697           doomsday anticipation
## 6698           doomsday      disgust
## 6699           doomsday         fear
## 6700           doomsday     negative
## 6701           doomsday      sadness
## 6702              leave     negative
## 6703              leave      sadness
## 6704              leave     surprise
## 6705             ignore     negative
## 6706               fair     positive
## 6707                don     positive
## 6708                don        trust
## 6709             happen anticipation
## 6710               real     positive
## 6711               real        trust
## 6712          suffering      disgust
## 6713          suffering         fear
## 6714          suffering     negative
## 6715          suffering      sadness
## 6716          aftermath        anger
## 6717          aftermath      disgust
## 6718          aftermath         fear
## 6719          aftermath     negative
## 6720          aftermath      sadness
## 6721               cool     positive
## 6722             lesser      disgust
## 6723             lesser     negative
## 6724             degree     positive
## 6725           defender     positive
## 6726           defender        trust
## 6727               lava        anger
## 6728               lava         fear
## 6729               lava     negative
## 6730              flood         fear
## 6731               grow anticipation
## 6732               grow          joy
## 6733               grow     positive
## 6734               grow        trust
## 6735                sun anticipation
## 6736                sun          joy
## 6737                sun     positive
## 6738                sun     surprise
## 6739                sun        trust
## 6740               grow anticipation
## 6741               grow          joy
## 6742               grow     positive
## 6743               grow        trust
## 6744         efficiency     positive
## 6745            survive     positive
## 6746              curse        anger
## 6747              curse      disgust
## 6748              curse         fear
## 6749              curse     negative
## 6750              curse      sadness
## 6751               grow anticipation
## 6752               grow          joy
## 6753               grow     positive
## 6754               grow        trust
## 6755           defender     positive
## 6756           defender        trust
## 6757             theory anticipation
## 6758             theory        trust
## 6759             theory anticipation
## 6760             theory        trust
## 6761               real     positive
## 6762               real        trust
## 6763               time anticipation
## 6764             theory anticipation
## 6765             theory        trust
## 6766            explain     positive
## 6767            explain        trust
## 6768             theory anticipation
## 6769             theory        trust
## 6770          eradicate        anger
## 6771          eradicate     negative
## 6772       annihilation        anger
## 6773       annihilation         fear
## 6774       annihilation     negative
## 6775       annihilation      sadness
## 6776               real     positive
## 6777               real        trust
## 6778        eradication        anger
## 6779        eradication      disgust
## 6780        eradication         fear
## 6781        eradication     negative
## 6782           solution     positive
## 6783              moral        anger
## 6784              moral     positive
## 6785              moral        trust
## 6786            prevent         fear
## 6787              leave     negative
## 6788              leave      sadness
## 6789              leave     surprise
## 6790           innocent     positive
## 6791           innocent        trust
## 6792             reason     positive
## 6793             option     positive
## 6794                die         fear
## 6795                die     negative
## 6796                die      sadness
## 6797               shit        anger
## 6798               shit      disgust
## 6799               shit     negative
## 6800               shit        anger
## 6801               shit      disgust
## 6802               shit     negative
## 6803               shit        anger
## 6804               shit      disgust
## 6805               shit     negative
## 6806               kill         fear
## 6807               kill     negative
## 6808               kill      sadness
## 6809        probability anticipation
## 6810           question     positive
## 6811             change         fear
## 6812            subject     negative
## 6813        probability anticipation
## 6814        probability anticipation
## 6815           military         fear
## 6816               save          joy
## 6817               save     positive
## 6818               save        trust
## 6819               kill         fear
## 6820               kill     negative
## 6821               kill      sadness
## 6822             reason     positive
## 6823             choice     positive
## 6824            survive     positive
## 6825        possibility anticipation
## 6826             chance     surprise
## 6827             happen anticipation
## 6828              leave     negative
## 6829              leave      sadness
## 6830              leave     surprise
## 6831        probability anticipation
## 6832              doubt         fear
## 6833              doubt     negative
## 6834              doubt      sadness
## 6835              doubt        trust
## 6836          existence     positive
## 6837             change         fear
## 6838             theory anticipation
## 6839             theory        trust
## 6840          structure     positive
## 6841          structure        trust
## 6842                ash     negative
## 6843        destruction        anger
## 6844        destruction     negative
## 6845             create          joy
## 6846             create     positive
## 6847            fertile     positive
## 6848          cultivate anticipation
## 6849          cultivate     positive
## 6850          cultivate        trust
## 6851               food          joy
## 6852               food     positive
## 6853               food        trust
## 6854          resources          joy
## 6855          resources     positive
## 6856          resources        trust
## 6857       civilization     positive
## 6858       civilization        trust
## 6859               lose        anger
## 6860               lose      disgust
## 6861               lose         fear
## 6862               lose     negative
## 6863               lose      sadness
## 6864               lose     surprise
## 6865               slip     negative
## 6866               slip     surprise
## 6867               fall     negative
## 6868               fall      sadness
## 6869              watch anticipation
## 6870              watch         fear
## 6871              wrong     negative
## 6872             happen anticipation
## 6873             ignore     negative
## 6874             murder        anger
## 6875             murder      disgust
## 6876             murder         fear
## 6877             murder     negative
## 6878             murder      sadness
## 6879             murder     surprise
## 6880               hell        anger
## 6881               hell      disgust
## 6882               hell         fear
## 6883               hell     negative
## 6884               hell      sadness
## 6885             cursed        anger
## 6886             cursed         fear
## 6887             cursed     negative
## 6888             cursed      sadness
## 6889             unique     positive
## 6890             unique     surprise
## 6891             center     positive
## 6892             center        trust
## 6893            salient     positive
## 6894              major     positive
## 6895             insane        anger
## 6896             insane         fear
## 6897             insane     negative
## 6898             insane        anger
## 6899             insane         fear
## 6900             insane     negative
## 6901            shooter         fear
## 6902              worse         fear
## 6903              worse     negative
## 6904              worse      sadness
## 6905               wait anticipation
## 6906               wait     negative
## 6907              lower     negative
## 6908              lower      sadness
## 6909           politics        anger
## 6910             change         fear
## 6911              major     positive
## 6912             threat        anger
## 6913             threat         fear
## 6914             threat     negative
## 6915           relative        trust
## 6916            hostile        anger
## 6917            hostile      disgust
## 6918            hostile         fear
## 6919            hostile     negative
## 6920            salient     positive
## 6921              elect     positive
## 6922              elect        trust
## 6923              trump     surprise
## 6924             change         fear
## 6925              lower     negative
## 6926              lower      sadness
## 6927            bizarre     negative
## 6928            bizarre     surprise
## 6929         antagonism        anger
## 6930         antagonism     negative
## 6931              major     positive
## 6932             threat        anger
## 6933             threat         fear
## 6934             threat     negative
## 6935              worry anticipation
## 6936              worry         fear
## 6937              worry     negative
## 6938              worry      sadness
## 6939              worse         fear
## 6940              worse     negative
## 6941              worse      sadness
## 6942            drought     negative
## 6943             change         fear
## 6944                don     positive
## 6945                don        trust
## 6946             change         fear
## 6947              civil     positive
## 6948                war         fear
## 6949                war     negative
## 6950            foreign     negative
## 6951               doom         fear
## 6952               doom     negative
## 6953              gloom     negative
## 6954              gloom      sadness
## 6955               deal anticipation
## 6956               deal          joy
## 6957               deal     positive
## 6958               deal     surprise
## 6959               deal        trust
## 6960            drought     negative
## 6961         management     positive
## 6962         management        trust
## 6963             change         fear
## 6964            drought     negative
## 6965        threatening        anger
## 6966        threatening      disgust
## 6967        threatening         fear
## 6968        threatening     negative
## 6969              sense     positive
## 6970          concerned         fear
## 6971          concerned      sadness
## 6972               deal anticipation
## 6973               deal          joy
## 6974               deal     positive
## 6975               deal     surprise
## 6976               deal        trust
## 6977             change         fear
## 6978          resources          joy
## 6979          resources     positive
## 6980          resources        trust
## 6981             manage     positive
## 6982             manage        trust
## 6983            despise        anger
## 6984            despise      disgust
## 6985            despise     negative
## 6986             create          joy
## 6987             create     positive
## 6988               pose     negative
## 6989               real     positive
## 6990               real        trust
## 6991             threat        anger
## 6992             threat         fear
## 6993             threat     negative
## 6994             coming anticipation
## 6995               lose        anger
## 6996               lose      disgust
## 6997               lose         fear
## 6998               lose     negative
## 6999               lose      sadness
## 7000               lose     surprise
## 7001        instability      disgust
## 7002        instability         fear
## 7003        instability     negative
## 7004         government         fear
## 7005         government     negative
## 7006               hate        anger
## 7007               hate      disgust
## 7008               hate         fear
## 7009               hate     negative
## 7010               hate      sadness
## 7011           friendly anticipation
## 7012           friendly          joy
## 7013           friendly     positive
## 7014           friendly        trust
## 7015             leader     positive
## 7016             leader        trust
## 7017             change         fear
## 7018            opposed        anger
## 7019            opposed         fear
## 7020            opposed     negative
## 7021            corrupt     negative
## 7022            corrupt     negative
## 7023           question     positive
## 7024            corrupt     negative
## 7025            corrupt     negative
## 7026            corrupt     negative
## 7027              force        anger
## 7028              force         fear
## 7029              force     negative
## 7030           judicial anticipation
## 7031           judicial     positive
## 7032           judicial        trust
## 7033             reform     positive
## 7034               deal anticipation
## 7035               deal          joy
## 7036               deal     positive
## 7037               deal     surprise
## 7038               deal        trust
## 7039               jail         fear
## 7040               jail     negative
## 7041               jail      sadness
## 7042         corruption      disgust
## 7043         corruption     negative
## 7044              trump     surprise
## 7045               lost     negative
## 7046               lost      sadness
## 7047              force        anger
## 7048              force         fear
## 7049              force     negative
## 7050              prime     positive
## 7051               ship anticipation
## 7052               safe          joy
## 7053               safe     positive
## 7054               safe        trust
## 7055               deal anticipation
## 7056               deal          joy
## 7057               deal     positive
## 7058               deal     surprise
## 7059               deal        trust
## 7060              devil        anger
## 7061              devil anticipation
## 7062              devil      disgust
## 7063              devil         fear
## 7064              devil     negative
## 7065              devil      sadness
## 7066               ally     positive
## 7067               ally        trust
## 7068                god anticipation
## 7069                god         fear
## 7070                god          joy
## 7071                god     positive
## 7072                god        trust
## 7073             happen anticipation
## 7074           constant     positive
## 7075           constant        trust
## 7076               risk anticipation
## 7077               risk         fear
## 7078               risk     negative
## 7079              death        anger
## 7080              death anticipation
## 7081              death      disgust
## 7082              death         fear
## 7083              death     negative
## 7084              death      sadness
## 7085              death     surprise
## 7086             terror         fear
## 7087             terror     negative
## 7088             attack        anger
## 7089             attack         fear
## 7090             attack     negative
## 7091          dangerous         fear
## 7092          dangerous     negative
## 7093          surprised     surprise
## 7094             public anticipation
## 7095             public     positive
## 7096             theory anticipation
## 7097             theory        trust
## 7098             action     positive
## 7099              guess     surprise
## 7100              guess     surprise
## 7101              focus     positive
## 7102           conflict        anger
## 7103           conflict         fear
## 7104           conflict     negative
## 7105           conflict      sadness
## 7106               hell        anger
## 7107               hell      disgust
## 7108               hell         fear
## 7109               hell     negative
## 7110               hell      sadness
## 7111              chart        trust
## 7112               shit        anger
## 7113               shit      disgust
## 7114               shit     negative
## 7115             change         fear
## 7116               real     positive
## 7117               real        trust
## 7118              chart        trust
## 7119               talk     positive
## 7120              radio     positive
## 7121        influential     positive
## 7122        influential        trust
## 7123              visit     positive
## 7124               time anticipation
## 7125               rage        anger
## 7126               rage     negative
## 7127         propaganda     negative
## 7128             reason     positive
## 7129                sky     positive
## 7130                sky     positive
## 7131            explain     positive
## 7132            explain        trust
## 7133               shit        anger
## 7134               shit      disgust
## 7135               shit     negative
## 7136          advantage     positive
## 7137               dumb     negative
## 7138             stupid     negative
## 7139            economy        trust
## 7140             giving     positive
## 7141            freedom          joy
## 7142            freedom     positive
## 7143            freedom        trust
## 7144              trade        trust
## 7145             public anticipation
## 7146             public     positive
## 7147              leave     negative
## 7148              leave      sadness
## 7149              leave     surprise
## 7150               hate        anger
## 7151               hate      disgust
## 7152               hate         fear
## 7153               hate     negative
## 7154               hate      sadness
## 7155               love          joy
## 7156               love     positive
## 7157             public anticipation
## 7158             public     positive
## 7159              found          joy
## 7160              found     positive
## 7161              found        trust
## 7162            sarcasm        anger
## 7163            sarcasm      disgust
## 7164            sarcasm     negative
## 7165            sarcasm      sadness
## 7166             police         fear
## 7167             police     positive
## 7168             police        trust
## 7169               real     positive
## 7170               real        trust
## 7171              bound     negative
## 7172                god anticipation
## 7173                god         fear
## 7174                god          joy
## 7175                god     positive
## 7176                god        trust
## 7177              wrong     negative
## 7178               kill         fear
## 7179               kill     negative
## 7180               kill      sadness
## 7181               time anticipation
## 7182                god anticipation
## 7183                god         fear
## 7184                god          joy
## 7185                god     positive
## 7186                god        trust
## 7187           horrible        anger
## 7188           horrible      disgust
## 7189           horrible         fear
## 7190           horrible     negative
## 7191              trend     positive
## 7192           horrible        anger
## 7193           horrible      disgust
## 7194           horrible         fear
## 7195           horrible     negative
## 7196             hidden     negative
## 7197            blanket        trust
## 7198             decent     positive
## 7199              trump     surprise
## 7200             pretty anticipation
## 7201             pretty          joy
## 7202             pretty     positive
## 7203             pretty        trust
## 7204             cursed        anger
## 7205             cursed         fear
## 7206             cursed     negative
## 7207             cursed      sadness
## 7208               time anticipation
## 7209               jump          joy
## 7210               jump     positive
## 7211               time anticipation
## 7212           biblical     positive
## 7213              curse        anger
## 7214              curse      disgust
## 7215              curse         fear
## 7216              curse     negative
## 7217              curse      sadness
## 7218             agreed     positive
## 7219             agreed        trust
## 7220          curiosity anticipation
## 7221          curiosity     positive
## 7222          curiosity     surprise
## 7223            culture     positive
## 7224           alliance        trust
## 7225          grievance        anger
## 7226          grievance      disgust
## 7227          grievance     negative
## 7228          grievance      sadness
## 7229              greed        anger
## 7230              greed      disgust
## 7231              greed     negative
## 7232            careful     positive
## 7233              anger        anger
## 7234              anger     negative
## 7235           republic     negative
## 7236        proposition     positive
## 7237              slave        anger
## 7238              slave         fear
## 7239              slave     negative
## 7240              slave      sadness
## 7241              labor anticipation
## 7242              labor          joy
## 7243              labor     positive
## 7244              labor     surprise
## 7245              labor        trust
## 7246       incompatible        anger
## 7247       incompatible      disgust
## 7248       incompatible     negative
## 7249       incompatible      sadness
## 7250            tension        anger
## 7251               calm     positive
## 7252           nonsense     negative
## 7253              laugh          joy
## 7254              laugh     positive
## 7255              laugh     surprise
## 7256               hurt        anger
## 7257               hurt         fear
## 7258               hurt     negative
## 7259               hurt      sadness
## 7260            winning anticipation
## 7261            winning      disgust
## 7262            winning          joy
## 7263            winning     positive
## 7264            winning      sadness
## 7265            winning     surprise
## 7266            winning        trust
## 7267              start anticipation
## 7268           humanity          joy
## 7269           humanity     positive
## 7270           humanity        trust
## 7271           divinity     positive
## 7272                god anticipation
## 7273                god         fear
## 7274                god          joy
## 7275                god     positive
## 7276                god        trust
## 7277               fear        anger
## 7278               fear         fear
## 7279               fear     negative
## 7280              burnt      disgust
## 7281              burnt     negative
## 7282           divinity     positive
## 7283               time anticipation
## 7284            cutting        anger
## 7285            cutting      disgust
## 7286            cutting         fear
## 7287            cutting     negative
## 7288            cutting      sadness
## 7289       inhospitable     negative
## 7290       inhospitable      sadness
## 7291           humanity          joy
## 7292           humanity     positive
## 7293           humanity        trust
## 7294       confirmation        trust
## 7295             insane        anger
## 7296             insane         fear
## 7297             insane     negative
## 7298           deranged        anger
## 7299           deranged      disgust
## 7300           deranged         fear
## 7301           deranged     negative
## 7302             pretty anticipation
## 7303             pretty          joy
## 7304             pretty     positive
## 7305             pretty        trust
## 7306         propaganda     negative
## 7307         propaganda     negative
## 7308               true          joy
## 7309               true     positive
## 7310               true        trust
## 7311    cytomegalovirus     negative
## 7312    cytomegalovirus      sadness
## 7313               join     positive
## 7314             center     positive
## 7315             center        trust
## 7316              guess     surprise
## 7317               cool     positive
## 7318        progressive     positive
## 7319             change         fear
## 7320        progressive     positive
## 7321              spine        anger
## 7322              spine     negative
## 7323              spine     positive
## 7324          socialist        anger
## 7325          socialist      disgust
## 7326          socialist         fear
## 7327          socialist     negative
## 7328          socialist      sadness
## 7329             change         fear
## 7330             taught        trust
## 7331               deny        anger
## 7332               deny     negative
## 7333              blame        anger
## 7334              blame      disgust
## 7335              blame     negative
## 7336              green          joy
## 7337              green     positive
## 7338              green        trust
## 7339           assembly     positive
## 7340           assembly        trust
## 7341               joke     negative
## 7342               fear        anger
## 7343               fear         fear
## 7344               fear     negative
## 7345          influence     negative
## 7346          influence     positive
## 7347          coalition     positive
## 7348             growth     positive
## 7349          influence     negative
## 7350          influence     positive
## 7351          communist     negative
## 7352               akin        trust
## 7353            content          joy
## 7354            content     positive
## 7355            content        trust
## 7356            worried     negative
## 7357            worried      sadness
## 7358         conspiracy         fear
## 7359          excluding     negative
## 7360          excluding      sadness
## 7361               hate        anger
## 7362               hate      disgust
## 7363               hate         fear
## 7364               hate     negative
## 7365               hate      sadness
## 7366             change         fear
## 7367            explain     positive
## 7368            explain        trust
## 7369            culture     positive
## 7370               hate        anger
## 7371               hate      disgust
## 7372               hate         fear
## 7373               hate     negative
## 7374               hate      sadness
## 7375           familiar     positive
## 7376           familiar        trust
## 7377             fairly     positive
## 7378             fairly        trust
## 7379           threaten        anger
## 7380           threaten anticipation
## 7381           threaten         fear
## 7382           threaten     negative
## 7383        traditional     positive
## 7384            respect anticipation
## 7385            respect          joy
## 7386            respect     positive
## 7387            respect        trust
## 7388            freedom          joy
## 7389            freedom     positive
## 7390            freedom        trust
## 7391             speech     positive
## 7392             system        trust
## 7393              lower     negative
## 7394              lower      sadness
## 7395              lucky          joy
## 7396              lucky     positive
## 7397              lucky     surprise
## 7398              avoid         fear
## 7399              avoid     negative
## 7400             skewed        anger
## 7401             skewed anticipation
## 7402             skewed     negative
## 7403              pride          joy
## 7404              pride     positive
## 7405            achieve          joy
## 7406            achieve     positive
## 7407            achieve        trust
## 7408              trump     surprise
## 7409               flow     positive
## 7410             growth     positive
## 7411         discussion     positive
## 7412              usual     positive
## 7413              usual        trust
## 7414          socialist        anger
## 7415          socialist      disgust
## 7416          socialist         fear
## 7417          socialist     negative
## 7418          socialist      sadness
## 7419             center     positive
## 7420             center        trust
## 7421             pretty anticipation
## 7422             pretty          joy
## 7423             pretty     positive
## 7424             pretty        trust
## 7425             center     positive
## 7426             center        trust
## 7427              unity     positive
## 7428              unity        trust
## 7429             center     positive
## 7430             center        trust
## 7431             center     positive
## 7432             center        trust
## 7433            liberal     negative
## 7434            liberal     positive
## 7435             center     positive
## 7436             center        trust
## 7437             center     positive
## 7438             center        trust
## 7439             center     positive
## 7440             center        trust
## 7441               true          joy
## 7442               true     positive
## 7443               true        trust
## 7444              start anticipation
## 7445            cabinet     positive
## 7446            cabinet        trust
## 7447               cold     negative
## 7448      mediterranean     positive
## 7449             afraid         fear
## 7450             afraid     negative
## 7451             change         fear
## 7452           increase     positive
## 7453              major     positive
## 7454             threat        anger
## 7455             threat         fear
## 7456             threat     negative
## 7457          resilient     positive
## 7458              storm        anger
## 7459              storm     negative
## 7460             pretty anticipation
## 7461             pretty          joy
## 7462             pretty     positive
## 7463             pretty        trust
## 7464              moral        anger
## 7465              moral     positive
## 7466              moral        trust
## 7467           shooting        anger
## 7468           shooting         fear
## 7469           shooting     negative
## 7470              major     positive
## 7471             threat        anger
## 7472             threat         fear
## 7473             threat     negative
## 7474             change         fear
## 7475          convinced        trust
## 7476             actual     positive
## 7477                war         fear
## 7478                war     negative
## 7479             league     positive
## 7480                war         fear
## 7481                war     negative
## 7482             league     positive
## 7483           alliance        trust
## 7484              money        anger
## 7485              money anticipation
## 7486              money          joy
## 7487              money     positive
## 7488              money     surprise
## 7489              money        trust
## 7490            benefit     positive
## 7491              trade        trust
## 7492            benefit     positive
## 7493              trade        trust
## 7494                war         fear
## 7495                war     negative
## 7496             reason     positive
## 7497              fault     negative
## 7498              fault      sadness
## 7499              trade        trust
## 7500                war         fear
## 7501                war     negative
## 7502          convinced        trust
## 7503               shit        anger
## 7504               shit      disgust
## 7505               shit     negative
## 7506           believed        trust
## 7507            rapture anticipation
## 7508            rapture          joy
## 7509            rapture     positive
## 7510          righteous     positive
## 7511              death        anger
## 7512              death anticipation
## 7513              death      disgust
## 7514              death         fear
## 7515              death     negative
## 7516              death      sadness
## 7517              death     surprise
## 7518              moral        anger
## 7519              moral     positive
## 7520              moral        trust
## 7521           military         fear
## 7522              force        anger
## 7523              force         fear
## 7524              force     negative
## 7525           incident     surprise
## 7526             deadly        anger
## 7527             deadly      disgust
## 7528             deadly         fear
## 7529             deadly     negative
## 7530             deadly      sadness
## 7531           military         fear
## 7532               fire         fear
## 7533        accountable     positive
## 7534        accountable        trust
## 7535            suggest        trust
## 7536         unreliable     negative
## 7537         unreliable        trust
## 7538                war         fear
## 7539                war     negative
## 7540               hurt        anger
## 7541               hurt         fear
## 7542               hurt     negative
## 7543               hurt      sadness
## 7544               feat anticipation
## 7545               feat          joy
## 7546               feat     positive
## 7547               feat     surprise
## 7548                war         fear
## 7549                war     negative
## 7550       organization anticipation
## 7551       organization          joy
## 7552       organization     positive
## 7553       organization     surprise
## 7554       organization        trust
## 7555             status     positive
## 7556          confirmed     positive
## 7557          confirmed        trust
## 7558         journalist     positive
## 7559            suggest        trust
## 7560           included     positive
## 7561             marked     positive
## 7562             threat        anger
## 7563             threat         fear
## 7564             threat     negative
## 7565           personal        trust
## 7566         unreliable     negative
## 7567         unreliable        trust
## 7568         unreliable     negative
## 7569         unreliable        trust
## 7570                war         fear
## 7571                war     negative
## 7572               hurt        anger
## 7573               hurt         fear
## 7574               hurt     negative
## 7575               hurt      sadness
## 7576               feat anticipation
## 7577               feat          joy
## 7578               feat     positive
## 7579               feat     surprise
## 7580         misconduct      disgust
## 7581         misconduct     negative
## 7582            justice     positive
## 7583            justice        trust
## 7584            killing        anger
## 7585            killing         fear
## 7586            killing     negative
## 7587            killing      sadness
## 7588      investigation anticipation
## 7589                war         fear
## 7590                war     negative
## 7591       organization anticipation
## 7592       organization          joy
## 7593       organization     positive
## 7594       organization     surprise
## 7595       organization        trust
## 7596         misconduct      disgust
## 7597         misconduct     negative
## 7598             murder        anger
## 7599             murder      disgust
## 7600             murder         fear
## 7601             murder     negative
## 7602             murder      sadness
## 7603             murder     surprise
## 7604            explain     positive
## 7605            explain        trust
## 7606          objective anticipation
## 7607          objective     positive
## 7608          objective        trust
## 7609            denying anticipation
## 7610            denying     negative
## 7611          holocaust        anger
## 7612          holocaust      disgust
## 7613          holocaust         fear
## 7614          holocaust     negative
## 7615          holocaust      sadness
## 7616          operation         fear
## 7617          operation        trust
## 7618               lead     positive
## 7619           accusing        anger
## 7620           accusing         fear
## 7621           accusing     negative
## 7622         misconduct      disgust
## 7623         misconduct     negative
## 7624            explain     positive
## 7625            explain        trust
## 7626            explain     positive
## 7627            explain        trust
## 7628               hurt        anger
## 7629               hurt         fear
## 7630               hurt     negative
## 7631               hurt      sadness
## 7632              fault     negative
## 7633              fault      sadness
## 7634                war         fear
## 7635                war     negative
## 7636        prosecution      disgust
## 7637        prosecution     negative
## 7638               cool     positive
## 7639           rational     positive
## 7640           rational        trust
## 7641         discussion     positive
## 7642             murder        anger
## 7643             murder      disgust
## 7644             murder         fear
## 7645             murder     negative
## 7646             murder      sadness
## 7647             murder     surprise
## 7648            explain     positive
## 7649            explain        trust
## 7650             giving     positive
## 7651           isolated         fear
## 7652           isolated     negative
## 7653           isolated      sadness
## 7654           incident     surprise
## 7655            medical anticipation
## 7656            medical         fear
## 7657            medical     positive
## 7658            medical        trust
## 7659               shot        anger
## 7660               shot         fear
## 7661               shot     negative
## 7662               shot      sadness
## 7663               shot     surprise
## 7664          objective anticipation
## 7665          objective     positive
## 7666          objective        trust
## 7667               cool     positive
## 7668           rational     positive
## 7669           rational        trust
## 7670         discussion     positive
## 7671             mobile anticipation
## 7672              moral        anger
## 7673              moral     positive
## 7674              moral        trust
## 7675             action     positive
## 7676            contact     positive
## 7677            benefit     positive
## 7678             change         fear
## 7679           disagree        anger
## 7680           disagree     negative
## 7681               cold     negative
## 7682                hot        anger
## 7683           relevant     positive
## 7684           relevant        trust
## 7685             offset anticipation
## 7686             offset     positive
## 7687               true          joy
## 7688               true     positive
## 7689               true        trust
## 7690               time anticipation
## 7691         prediction anticipation
## 7692               cold     negative
## 7693             change         fear
## 7694              major     positive
## 7695             threat        anger
## 7696             threat         fear
## 7697             threat     negative
## 7698              worth     positive
## 7699          concerned         fear
## 7700          concerned      sadness
## 7701             change         fear
## 7702              birth anticipation
## 7703              birth         fear
## 7704              birth          joy
## 7705              birth     positive
## 7706              birth        trust
## 7707               baby          joy
## 7708               baby     positive
## 7709           optimism anticipation
## 7710           optimism          joy
## 7711           optimism     positive
## 7712           optimism     surprise
## 7713           optimism        trust
## 7714              scare        anger
## 7715              scare anticipation
## 7716              scare         fear
## 7717              scare     negative
## 7718              scare     surprise
## 7719             pretty anticipation
## 7720             pretty          joy
## 7721             pretty     positive
## 7722             pretty        trust
## 7723             desert        anger
## 7724             desert      disgust
## 7725             desert         fear
## 7726             desert     negative
## 7727             desert      sadness
## 7728            drought     negative
## 7729               arid     negative
## 7730               arid      sadness
## 7731                hot        anger
## 7732                mud     negative
## 7733                don     positive
## 7734                don        trust
## 7735             insane        anger
## 7736             insane         fear
## 7737             insane     negative
## 7738              worse         fear
## 7739              worse     negative
## 7740              worse      sadness
## 7741             change         fear
## 7742           relative        trust
## 7743             stupid     negative
## 7744             insane        anger
## 7745             insane         fear
## 7746             insane     negative
## 7747               main     positive
## 7748             church anticipation
## 7749             church          joy
## 7750             church     positive
## 7751             church        trust
## 7752           religion        trust
## 7753           preserve     positive
## 7754           moderate     positive
## 7755             church anticipation
## 7756             church          joy
## 7757             church     positive
## 7758             church        trust
## 7759           mannered     positive
## 7760                jam     positive
## 7761           electric          joy
## 7762           electric     positive
## 7763           electric     surprise
## 7764              start anticipation
## 7765              start anticipation
## 7766               shit        anger
## 7767               shit      disgust
## 7768               shit     negative
## 7769          expecting anticipation
## 7770              music          joy
## 7771              music     positive
## 7772              music      sadness
## 7773             expert     positive
## 7774             expert        trust
## 7775               crap      disgust
## 7776               crap     negative
## 7777            remains      disgust
## 7778            remains         fear
## 7779            remains     negative
## 7780            remains     positive
## 7781            remains        trust
## 7782                sir     positive
## 7783                sir        trust
## 7784            benefit     positive
## 7785             shabby      disgust
## 7786             shabby     negative
## 7787            decline     negative
## 7788                sea     positive
## 7789          dependent     negative
## 7790          dependent     positive
## 7791          dependent        trust
## 7792            benefit     positive
## 7793               rock     positive
## 7794              green          joy
## 7795              green     positive
## 7796              green        trust
## 7797               deal anticipation
## 7798               deal          joy
## 7799               deal     positive
## 7800               deal     surprise
## 7801               deal        trust
## 7802               hate        anger
## 7803               hate      disgust
## 7804               hate         fear
## 7805               hate     negative
## 7806               hate      sadness
## 7807           relative        trust
## 7808         opposition        anger
## 7809         opposition     negative
## 7810               time anticipation
## 7811             theory anticipation
## 7812             theory        trust
## 7813              coast     positive
## 7814             vision anticipation
## 7815             vision     positive
## 7816            finally anticipation
## 7817            finally      disgust
## 7818            finally          joy
## 7819            finally     positive
## 7820            finally     surprise
## 7821            finally        trust
## 7822             effort     positive
## 7823              steal        anger
## 7824              steal         fear
## 7825              steal     negative
## 7826              steal      sadness
## 7827             ground        trust
## 7828              board anticipation
## 7829           isolated         fear
## 7830           isolated     negative
## 7831           isolated      sadness
## 7832         parliament        trust
## 7833         completely     positive
## 7834            culture     positive
## 7835              found          joy
## 7836              found     positive
## 7837              found        trust
## 7838             change         fear
## 7839              green          joy
## 7840              green     positive
## 7841              green        trust
## 7842         thoughtful     positive
## 7843         thoughtful        trust
## 7844               time anticipation
## 7845               king     positive
## 7846               time anticipation
## 7847          influence     negative
## 7848          influence     positive
## 7849              agree     positive
## 7850             coming anticipation
## 7851             change         fear
## 7852           worrying anticipation
## 7853           worrying         fear
## 7854           worrying     negative
## 7855           worrying      sadness
## 7856           strongly     positive
## 7857             change         fear
## 7858             luxury          joy
## 7859             luxury     positive
## 7860             center     positive
## 7861             center        trust
## 7862              chart        trust
## 7863             result anticipation
## 7864          communism        anger
## 7865          communism         fear
## 7866          communism     negative
## 7867          communism      sadness
## 7868             change         fear
## 7869              demon        anger
## 7870              demon      disgust
## 7871              demon         fear
## 7872              demon     negative
## 7873              demon      sadness
## 7874                don     positive
## 7875                don        trust
## 7876          socialism      disgust
## 7877          socialism         fear
## 7878              demon        anger
## 7879              demon      disgust
## 7880              demon         fear
## 7881              demon     negative
## 7882              demon      sadness
## 7883             polish     positive
## 7884             center     positive
## 7885             center        trust
## 7886              lower     negative
## 7887              lower      sadness
## 7888             polish     positive
## 7889              lower     negative
## 7890              lower      sadness
## 7891             change         fear
## 7892              lower     negative
## 7893              lower      sadness
## 7894            leaning        trust
## 7895          communist     negative
## 7896                don     positive
## 7897                don        trust
## 7898           worrying anticipation
## 7899           worrying         fear
## 7900           worrying     negative
## 7901           worrying      sadness
## 7902             change         fear
## 7903            content          joy
## 7904            content     positive
## 7905            content        trust
## 7906             change         fear
## 7907             threat        anger
## 7908             threat         fear
## 7909             threat     negative
## 7910             change         fear
## 7911              major     positive
## 7912            economy        trust
## 7913               poll        trust
## 7914               gain anticipation
## 7915               gain          joy
## 7916               gain     positive
## 7917             ignore     negative
## 7918             happen anticipation
## 7919             threat        anger
## 7920             threat         fear
## 7921             threat     negative
## 7922              major     positive
## 7923             threat        anger
## 7924             threat         fear
## 7925             threat     negative
## 7926              avoid         fear
## 7927              avoid     negative
## 7928              major     positive
## 7929             larger      disgust
## 7930             larger     surprise
## 7931             larger        trust
## 7932          reluctant         fear
## 7933          reluctant     negative
## 7934              label        trust
## 7935             change         fear
## 7936              major     positive
## 7937             threat        anger
## 7938             threat         fear
## 7939             threat     negative
## 7940          statement     positive
## 7941          statement        trust
## 7942          statement     positive
## 7943          statement        trust
## 7944         unofficial     negative
## 7945            leading        trust
## 7946             change         fear
## 7947             warned anticipation
## 7948             warned         fear
## 7949             warned     surprise
## 7950             change         fear
## 7951           continue anticipation
## 7952           continue     positive
## 7953           continue        trust
## 7954            delayed     negative
## 7955         prediction anticipation
## 7956         surpassing     positive
## 7957         university anticipation
## 7958         university     positive
## 7959          confirmed     positive
## 7960          confirmed        trust
## 7961              daily anticipation
## 7962         unofficial     negative
## 7963           question     positive
## 7964             change         fear
## 7965             expect anticipation
## 7966             expect     positive
## 7967             expect     surprise
## 7968             expect        trust
## 7969               lead     positive
## 7970              major     positive
## 7971              title     positive
## 7972              title        trust
## 7973        experienced     positive
## 7974        experienced        trust
## 7975          including     positive
## 7976             warned anticipation
## 7977             warned         fear
## 7978             warned     surprise
## 7979          including     positive
## 7980                sea     positive
## 7981           collapse      disgust
## 7982           collapse         fear
## 7983           collapse     negative
## 7984           collapse      sadness
## 7985             action     positive
## 7986              delay        anger
## 7987              delay      disgust
## 7988              delay         fear
## 7989              delay     negative
## 7990              delay      sadness
## 7991               time anticipation
## 7992               plan anticipation
## 7993           inaction     negative
## 7994             senate        trust
## 7995              clock anticipation
## 7996            comfort anticipation
## 7997            comfort          joy
## 7998            comfort     positive
## 7999            comfort        trust
## 8000            screwed        anger
## 8001            screwed     negative
## 8002               time anticipation
## 8003              focus     positive
## 8004           violence        anger
## 8005           violence         fear
## 8006           violence     negative
## 8007           violence      sadness
## 8008             giving     positive
## 8009           illusion     negative
## 8010           illusion     surprise
## 8011           peaceful anticipation
## 8012           peaceful          joy
## 8013           peaceful     positive
## 8014           peaceful     surprise
## 8015           peaceful        trust
## 8016               rule         fear
## 8017               rule        trust
## 8018              clock anticipation
## 8019            comfort anticipation
## 8020            comfort          joy
## 8021            comfort     positive
## 8022            comfort        trust
## 8023            screwed        anger
## 8024            screwed     negative
## 8025             pretty anticipation
## 8026             pretty          joy
## 8027             pretty     positive
## 8028             pretty        trust
## 8029                bad        anger
## 8030                bad      disgust
## 8031                bad         fear
## 8032                bad     negative
## 8033                bad      sadness
## 8034                bad        anger
## 8035                bad      disgust
## 8036                bad         fear
## 8037                bad     negative
## 8038                bad      sadness
## 8039             picnic anticipation
## 8040             picnic          joy
## 8041             picnic     positive
## 8042             picnic     surprise
## 8043             picnic        trust
## 8044               time anticipation
## 8045              force        anger
## 8046              force         fear
## 8047              force     negative
## 8048               baby          joy
## 8049               baby     positive
## 8050               wise     positive
## 8051      unprecedented     surprise
## 8052         prosperity     positive
## 8053               shit        anger
## 8054               shit      disgust
## 8055               shit     negative
## 8056               real     positive
## 8057               real        trust
## 8058          attention     positive
## 8059             secret        trust
## 8060                die         fear
## 8061                die     negative
## 8062                die      sadness
## 8063               food          joy
## 8064               food     positive
## 8065               food        trust
## 8066                bad        anger
## 8067                bad      disgust
## 8068                bad         fear
## 8069                bad     negative
## 8070                bad      sadness
## 8071             famous     positive
## 8072               food          joy
## 8073               food     positive
## 8074               food        trust
## 8075               risk anticipation
## 8076               risk         fear
## 8077               risk     negative
## 8078           majority          joy
## 8079           majority     positive
## 8080           majority        trust
## 8081         population     positive
## 8082           powerful        anger
## 8083           powerful anticipation
## 8084           powerful      disgust
## 8085           powerful         fear
## 8086           powerful          joy
## 8087           powerful     positive
## 8088           powerful        trust
## 8089              broke         fear
## 8090              broke     negative
## 8091              broke      sadness
## 8092            prepare anticipation
## 8093            prepare     positive
## 8094            protect     positive
## 8095               kill         fear
## 8096               kill     negative
## 8097               kill      sadness
## 8098               kill         fear
## 8099               kill     negative
## 8100               kill      sadness
## 8101               food          joy
## 8102               food     positive
## 8103               food        trust
## 8104             pretty anticipation
## 8105             pretty          joy
## 8106             pretty     positive
## 8107             pretty        trust
## 8108            violent        anger
## 8109            violent      disgust
## 8110            violent         fear
## 8111            violent     negative
## 8112            violent     surprise
## 8113         revolution        anger
## 8114         revolution anticipation
## 8115         revolution         fear
## 8116         revolution     negative
## 8117         revolution     positive
## 8118         revolution      sadness
## 8119         revolution     surprise
## 8120               food          joy
## 8121               food     positive
## 8122               food        trust
## 8123           continue anticipation
## 8124           continue     positive
## 8125           continue        trust
## 8126               food          joy
## 8127               food     positive
## 8128               food        trust
## 8129           threaten        anger
## 8130           threaten anticipation
## 8131           threaten         fear
## 8132           threaten     negative
## 8133            economy        trust
## 8134              money        anger
## 8135              money anticipation
## 8136              money          joy
## 8137              money     positive
## 8138              money     surprise
## 8139              money        trust
## 8140          pointless     negative
## 8141          pointless      sadness
## 8142            anarchy        anger
## 8143            anarchy         fear
## 8144            anarchy     negative
## 8145        responsible     positive
## 8146        responsible        trust
## 8147             change         fear
## 8148               fire         fear
## 8149             change         fear
## 8150             famine     negative
## 8151             famine      sadness
## 8152               late     negative
## 8153               late      sadness
## 8154             change         fear
## 8155             forget     negative
## 8156          convinced        trust
## 8157              fight        anger
## 8158              fight         fear
## 8159              fight     negative
## 8160          resources          joy
## 8161          resources     positive
## 8162          resources        trust
## 8163            survive     positive
## 8164             forget     negative
## 8165                job     positive
## 8166        distracting        anger
## 8167        distracting anticipation
## 8168        distracting     negative
## 8169             public anticipation
## 8170             public     positive
## 8171               time anticipation
## 8172        maintenance        trust
## 8173              break     surprise
## 8174            economy        trust
## 8175                pay anticipation
## 8176                pay          joy
## 8177                pay     positive
## 8178                pay        trust
## 8179          establish        trust
## 8180               farm anticipation
## 8181         technology     positive
## 8182            survive     positive
## 8183               safe          joy
## 8184               safe     positive
## 8185               safe        trust
## 8186             bunker         fear
## 8187           arrogant        anger
## 8188           arrogant      disgust
## 8189           arrogant     negative
## 8190              money        anger
## 8191              money anticipation
## 8192              money          joy
## 8193              money     positive
## 8194              money     surprise
## 8195              money        trust
## 8196               hire anticipation
## 8197               hire          joy
## 8198               hire     positive
## 8199               hire        trust
## 8200               wear     negative
## 8201               wear        trust
## 8202              shock        anger
## 8203              shock         fear
## 8204              shock     negative
## 8205              shock     surprise
## 8206              fever         fear
## 8207               sick      disgust
## 8208               sick     negative
## 8209               sick      sadness
## 8210              happy anticipation
## 8211              happy          joy
## 8212              happy     positive
## 8213              happy        trust
## 8214            healthy     positive
## 8215                die         fear
## 8216                die     negative
## 8217                die      sadness
## 8218              death        anger
## 8219              death anticipation
## 8220              death      disgust
## 8221              death         fear
## 8222              death     negative
## 8223              death      sadness
## 8224              death     surprise
## 8225          arrogance     negative
## 8226              money        anger
## 8227              money anticipation
## 8228              money          joy
## 8229              money     positive
## 8230              money     surprise
## 8231              money        trust
## 8232             stupid     negative
## 8233               fear        anger
## 8234               fear         fear
## 8235               fear     negative
## 8236               fear        anger
## 8237               fear         fear
## 8238               fear     negative
## 8239          democracy     positive
## 8240             threat        anger
## 8241             threat         fear
## 8242             threat     negative
## 8243         government         fear
## 8244         government     negative
## 8245            cabinet     positive
## 8246            cabinet        trust
## 8247               fell     negative
## 8248               fell      sadness
## 8249              delay        anger
## 8250              delay      disgust
## 8251              delay         fear
## 8252              delay     negative
## 8253              delay      sadness
## 8254              tired     negative
## 8255               safe          joy
## 8256               safe     positive
## 8257               safe        trust
## 8258              ready anticipation
## 8259              enjoy anticipation
## 8260              enjoy          joy
## 8261              enjoy     positive
## 8262              enjoy        trust
## 8263             suffer     negative
## 8264                top anticipation
## 8265                top     positive
## 8266                top        trust
## 8267              money        anger
## 8268              money anticipation
## 8269              money          joy
## 8270              money     positive
## 8271              money     surprise
## 8272              money        trust
## 8273         irrelevant     negative
## 8274             change         fear
## 8275           collapse      disgust
## 8276           collapse         fear
## 8277           collapse     negative
## 8278           collapse      sadness
## 8279             stocks     negative
## 8280           collapse      disgust
## 8281           collapse         fear
## 8282           collapse     negative
## 8283           collapse      sadness
## 8284               lose        anger
## 8285               lose      disgust
## 8286               lose         fear
## 8287               lose     negative
## 8288               lose      sadness
## 8289               lose     surprise
## 8290              money        anger
## 8291              money anticipation
## 8292              money          joy
## 8293              money     positive
## 8294              money     surprise
## 8295              money        trust
## 8296               lose        anger
## 8297               lose      disgust
## 8298               lose         fear
## 8299               lose     negative
## 8300               lose      sadness
## 8301               lose     surprise
## 8302             greedy      disgust
## 8303             greedy     negative
## 8304             change         fear
## 8305                die         fear
## 8306                die     negative
## 8307                die      sadness
## 8308             status     positive
## 8309              enjoy anticipation
## 8310              enjoy          joy
## 8311              enjoy     positive
## 8312              enjoy        trust
## 8313               time anticipation
## 8314                die         fear
## 8315                die     negative
## 8316                die      sadness
## 8317           collapse      disgust
## 8318           collapse         fear
## 8319           collapse     negative
## 8320           collapse      sadness
## 8321             forced         fear
## 8322             forced     negative
## 8323              start anticipation
## 8324              money        anger
## 8325              money anticipation
## 8326              money          joy
## 8327              money     positive
## 8328              money     surprise
## 8329              money        trust
## 8330              crazy        anger
## 8331              crazy         fear
## 8332              crazy     negative
## 8333              crazy      sadness
## 8334         technology     positive
## 8335             system        trust
## 8336            prevent         fear
## 8337           collapse      disgust
## 8338           collapse         fear
## 8339           collapse     negative
## 8340           collapse      sadness
## 8341           infinite     positive
## 8342             growth     positive
## 8343             pretty anticipation
## 8344             pretty          joy
## 8345             pretty     positive
## 8346             pretty        trust
## 8347              leave     negative
## 8348              leave      sadness
## 8349              leave     surprise
## 8350               cool     positive
## 8351                pay anticipation
## 8352                pay          joy
## 8353                pay     positive
## 8354                pay        trust
## 8355                hit        anger
## 8356                hit     negative
## 8357               time anticipation
## 8358              havoc        anger
## 8359              havoc         fear
## 8360              havoc     negative
## 8361             greedy      disgust
## 8362             greedy     negative
## 8363               kill         fear
## 8364               kill     negative
## 8365               kill      sadness
## 8366           personal        trust
## 8367               gain anticipation
## 8368               gain          joy
## 8369               gain     positive
## 8370          suffering      disgust
## 8371          suffering         fear
## 8372          suffering     negative
## 8373          suffering      sadness
## 8374               lack     negative
## 8375            empathy     positive
## 8376             wealth          joy
## 8377             wealth     positive
## 8378             wealth        trust
## 8379             status     positive
## 8380               kill         fear
## 8381               kill     negative
## 8382               kill      sadness
## 8383             giving     positive
## 8384             system        trust
## 8385             status     positive
## 8386             change         fear
## 8387           absolute     positive
## 8388             system        trust
## 8389             fellow     positive
## 8390             fellow        trust
## 8391           tomorrow anticipation
## 8392             wealth          joy
## 8393             wealth     positive
## 8394             wealth        trust
## 8395               real     positive
## 8396               real        trust
## 8397            bastion        anger
## 8398            bastion     positive
## 8399             wealth          joy
## 8400             wealth     positive
## 8401             wealth        trust
## 8402               fall     negative
## 8403               fall      sadness
## 8404               real     positive
## 8405               real        trust
## 8406             system        trust
## 8407              demon        anger
## 8408              demon      disgust
## 8409              demon         fear
## 8410              demon     negative
## 8411              demon      sadness
## 8412               love          joy
## 8413               love     positive
## 8414             prison        anger
## 8415             prison         fear
## 8416             prison     negative
## 8417             prison      sadness
## 8418               evil        anger
## 8419               evil      disgust
## 8420               evil         fear
## 8421               evil     negative
## 8422               evil      sadness
## 8423         correction     negative
## 8424               rein     negative
## 8425               real     positive
## 8426               real        trust
## 8427            empathy     positive
## 8428           reckless        anger
## 8429           reckless         fear
## 8430           reckless     negative
## 8431           reckless        anger
## 8432           reckless         fear
## 8433           reckless     negative
## 8434           continue anticipation
## 8435           continue     positive
## 8436           continue        trust
## 8437             happen anticipation
## 8438              crazy        anger
## 8439              crazy         fear
## 8440              crazy     negative
## 8441              crazy      sadness
## 8442                god anticipation
## 8443                god         fear
## 8444                god          joy
## 8445                god     positive
## 8446                god        trust
## 8447               dark      sadness
## 8448            selfish        anger
## 8449            selfish      disgust
## 8450            selfish     negative
## 8451             stupid     negative
## 8452              crazy        anger
## 8453              crazy         fear
## 8454              crazy     negative
## 8455              crazy      sadness
## 8456              guess     surprise
## 8457              waste      disgust
## 8458              waste     negative
## 8459              money        anger
## 8460              money anticipation
## 8461              money          joy
## 8462              money     positive
## 8463              money     surprise
## 8464              money        trust
## 8465          statement     positive
## 8466          statement        trust
## 8467          guarantee     positive
## 8468          guarantee        trust
## 8469           arrogant        anger
## 8470           arrogant      disgust
## 8471           arrogant     negative
## 8472             change         fear
## 8473              words        anger
## 8474              words     negative
## 8475               dire      disgust
## 8476               dire         fear
## 8477               dire     negative
## 8478               dire      sadness
## 8479               dire     surprise
## 8480           ignorant      disgust
## 8481           ignorant     negative
## 8482              blame        anger
## 8483              blame      disgust
## 8484              blame     negative
## 8485               late     negative
## 8486               late      sadness
## 8487             coming anticipation
## 8488            obvious     positive
## 8489            obvious        trust
## 8490           disaster        anger
## 8491           disaster      disgust
## 8492           disaster         fear
## 8493           disaster     negative
## 8494           disaster      sadness
## 8495           disaster     surprise
## 8496               ship anticipation
## 8497               ship anticipation
## 8498              giant         fear
## 8499           incident     surprise
## 8500               ship anticipation
## 8501          collision        anger
## 8502          collision     negative
## 8503               real     positive
## 8504               real        trust
## 8505             danger         fear
## 8506             danger     negative
## 8507             danger      sadness
## 8508          disappear         fear
## 8509            unlucky        anger
## 8510            unlucky      disgust
## 8511            unlucky         fear
## 8512            unlucky     negative
## 8513            unlucky      sadness
## 8514             pretty anticipation
## 8515             pretty          joy
## 8516             pretty     positive
## 8517             pretty        trust
## 8518                die         fear
## 8519                die     negative
## 8520                die      sadness
## 8521                die         fear
## 8522                die     negative
## 8523                die      sadness
## 8524          statement     positive
## 8525          statement        trust
## 8526         unofficial     negative
## 8527            leading        trust
## 8528             change         fear
## 8529             warned anticipation
## 8530             warned         fear
## 8531             warned     surprise
## 8532             change         fear
## 8533           continue anticipation
## 8534           continue     positive
## 8535           continue        trust
## 8536            delayed     negative
## 8537         prediction anticipation
## 8538         surpassing     positive
## 8539         university anticipation
## 8540         university     positive
## 8541          confirmed     positive
## 8542          confirmed        trust
## 8543              daily anticipation
## 8544         unofficial     negative
## 8545           question     positive
## 8546             change         fear
## 8547             expect anticipation
## 8548             expect     positive
## 8549             expect     surprise
## 8550             expect        trust
## 8551               lead     positive
## 8552              major     positive
## 8553              title     positive
## 8554              title        trust
## 8555        experienced     positive
## 8556        experienced        trust
## 8557          including     positive
## 8558             warned anticipation
## 8559             warned         fear
## 8560             warned     surprise
## 8561          including     positive
## 8562                sea     positive
## 8563              words        anger
## 8564              words     negative
## 8565            respect anticipation
## 8566            respect          joy
## 8567            respect     positive
## 8568            respect        trust
## 8569              catch     surprise
## 8570          statement     positive
## 8571          statement        trust
## 8572          agreement     positive
## 8573          agreement        trust
## 8574               time anticipation
## 8575                hot        anger
## 8576             breach     negative
## 8577                hot        anger
## 8578          impatient anticipation
## 8579          impatient     negative
## 8580             happen anticipation
## 8581             united     positive
## 8582             united        trust
## 8583             warned anticipation
## 8584             warned         fear
## 8585             warned     surprise
## 8586             change         fear
## 8587           continue anticipation
## 8588           continue     positive
## 8589           continue        trust
## 8590            delayed     negative
## 8591              grief     negative
## 8592              grief      sadness
## 8593              cream anticipation
## 8594              cream          joy
## 8595              cream     positive
## 8596              cream     surprise
## 8597           humanity          joy
## 8598           humanity     positive
## 8599           humanity        trust
## 8600               shit        anger
## 8601               shit      disgust
## 8602               shit     negative
## 8603           convince anticipation
## 8604           convince     positive
## 8605           convince        trust
## 8606              wrong     negative
## 8607              words        anger
## 8608              words     negative
## 8609               time anticipation
## 8610             choice     positive
## 8611            illness         fear
## 8612            illness     negative
## 8613            illness      sadness
## 8614                don     positive
## 8615                don        trust
## 8616               fake     negative
## 8617              cream anticipation
## 8618              cream          joy
## 8619              cream     positive
## 8620              cream     surprise
## 8621              treat        anger
## 8622              treat anticipation
## 8623              treat      disgust
## 8624              treat         fear
## 8625              treat          joy
## 8626              treat     negative
## 8627              treat     positive
## 8628              treat      sadness
## 8629              treat     surprise
## 8630              treat        trust
## 8631              slave        anger
## 8632              slave         fear
## 8633              slave     negative
## 8634              slave      sadness
## 8635              march     positive
## 8636              elite anticipation
## 8637              elite          joy
## 8638              elite     positive
## 8639              elite        trust
## 8640             change         fear
## 8641           guardian     positive
## 8642           guardian        trust
## 8643         journalist     positive
## 8644         pretending        anger
## 8645         pretending     negative
## 8646               wait anticipation
## 8647               wait     negative
## 8648          ignorance     negative
## 8649          impotence        anger
## 8650          impotence         fear
## 8651          impotence     negative
## 8652          impotence      sadness
## 8653            advance anticipation
## 8654            advance         fear
## 8655            advance          joy
## 8656            advance     positive
## 8657            advance     surprise
## 8658             change         fear
## 8659         conspiracy         fear
## 8660                eat     positive
## 8661            magical anticipation
## 8662            magical          joy
## 8663            magical     positive
## 8664            magical     surprise
## 8665             change         fear
## 8666               real     positive
## 8667               real        trust
## 8668           favorite          joy
## 8669           favorite     positive
## 8670           favorite        trust
## 8671              wrong     negative
## 8672              wrong     negative
## 8673              wrong     negative
## 8674               true          joy
## 8675               true     positive
## 8676               true        trust
## 8677               true          joy
## 8678               true     positive
## 8679               true        trust
## 8680             expect anticipation
## 8681             expect     positive
## 8682             expect     surprise
## 8683             expect        trust
## 8684           humanity          joy
## 8685           humanity     positive
## 8686           humanity        trust
## 8687              angry        anger
## 8688              angry      disgust
## 8689              angry     negative
## 8690             denial     negative
## 8691             change         fear
## 8692               real     positive
## 8693               real        trust
## 8694             change         fear
## 8695               hate        anger
## 8696               hate      disgust
## 8697               hate         fear
## 8698               hate     negative
## 8699               hate      sadness
## 8700             punish         fear
## 8701             punish     negative
## 8702              death        anger
## 8703              death anticipation
## 8704              death      disgust
## 8705              death         fear
## 8706              death     negative
## 8707              death      sadness
## 8708              death     surprise
## 8709           favorite          joy
## 8710           favorite     positive
## 8711           favorite        trust
## 8712                god anticipation
## 8713                god         fear
## 8714                god          joy
## 8715                god     positive
## 8716                god        trust
## 8717                die         fear
## 8718                die     negative
## 8719                die      sadness
## 8720                god anticipation
## 8721                god         fear
## 8722                god          joy
## 8723                god     positive
## 8724                god        trust
## 8725             coming anticipation
## 8726               baby          joy
## 8727               baby     positive
## 8728               real     positive
## 8729               real        trust
## 8730             freely          joy
## 8731             freely     positive
## 8732             freely        trust
## 8733              share anticipation
## 8734              share          joy
## 8735              share     positive
## 8736              share        trust
## 8737            uncanny         fear
## 8738            uncanny     negative
## 8739            uncanny     surprise
## 8740            ability     positive
## 8741        information     positive
## 8742              sense     positive
## 8743              beast        anger
## 8744              beast         fear
## 8745              beast     negative
## 8746             plight anticipation
## 8747             plight      disgust
## 8748             plight         fear
## 8749             plight     negative
## 8750             plight      sadness
## 8751               hire anticipation
## 8752               hire          joy
## 8753               hire     positive
## 8754               hire        trust
## 8755             agreed     positive
## 8756             agreed        trust
## 8757               pick     positive
## 8758              money        anger
## 8759              money anticipation
## 8760              money          joy
## 8761              money     positive
## 8762              money     surprise
## 8763              money        trust
## 8764           pathetic      disgust
## 8765           pathetic     negative
## 8766           pathetic      sadness
## 8767               ship anticipation
## 8768             doctor     positive
## 8769             doctor        trust
## 8770               quit     negative
## 8771           drinking     negative
## 8772             doctor     positive
## 8773             doctor        trust
## 8774              lines         fear
## 8775              daily anticipation
## 8776           spiteful        anger
## 8777           spiteful     negative
## 8778          destroyed        anger
## 8779          destroyed         fear
## 8780          destroyed     negative
## 8781          destroyed      sadness
## 8782            tornado         fear
## 8783            pacific     positive
## 8784               love          joy
## 8785               love     positive
## 8786               glad anticipation
## 8787               glad          joy
## 8788               glad     positive
## 8789            tornado         fear
## 8790         fanaticism         fear
## 8791           absolute     positive
## 8792            disgust        anger
## 8793            disgust      disgust
## 8794            disgust         fear
## 8795            disgust     negative
## 8796            disgust      sadness
## 8797               pain         fear
## 8798               pain     negative
## 8799               pain      sadness
## 8800              death        anger
## 8801              death anticipation
## 8802              death      disgust
## 8803              death         fear
## 8804              death     negative
## 8805              death      sadness
## 8806              death     surprise
## 8807          unnatural      disgust
## 8808          unnatural         fear
## 8809          unnatural     negative
## 8810          pessimism        anger
## 8811          pessimism         fear
## 8812          pessimism     negative
## 8813          pessimism      sadness
## 8814           humanity          joy
## 8815           humanity     positive
## 8816           humanity        trust
## 8817            disgust        anger
## 8818            disgust      disgust
## 8819            disgust         fear
## 8820            disgust     negative
## 8821            disgust      sadness
## 8822           humanity          joy
## 8823           humanity     positive
## 8824           humanity        trust
## 8825           morality     positive
## 8826           morality        trust
## 8827               fear        anger
## 8828               fear         fear
## 8829               fear     negative
## 8830                sky     positive
## 8831           morality     positive
## 8832           morality        trust
## 8833            logical     positive
## 8834           morality     positive
## 8835           morality        trust
## 8836                god anticipation
## 8837                god         fear
## 8838                god          joy
## 8839                god     positive
## 8840                god        trust
## 8841                god anticipation
## 8842                god         fear
## 8843                god          joy
## 8844                god     positive
## 8845                god        trust
## 8846            immoral        anger
## 8847            immoral      disgust
## 8848            immoral         fear
## 8849            immoral     negative
## 8850            immoral      sadness
## 8851             mother anticipation
## 8852             mother          joy
## 8853             mother     negative
## 8854             mother     positive
## 8855             mother      sadness
## 8856             mother        trust
## 8857             change         fear
## 8858             coming anticipation
## 8859              argue        anger
## 8860              argue     negative
## 8861             coming anticipation
## 8862             change         fear
## 8863              rabid        anger
## 8864              rabid anticipation
## 8865              rabid      disgust
## 8866              rabid         fear
## 8867              rabid     negative
## 8868              rabid      sadness
## 8869               spew      disgust
## 8870       indifference        anger
## 8871       indifference      disgust
## 8872       indifference         fear
## 8873       indifference     negative
## 8874       indifference      sadness
## 8875                law        trust
## 8876                god anticipation
## 8877                god         fear
## 8878                god          joy
## 8879                god     positive
## 8880                god        trust
## 8881               plan anticipation
## 8882            asshole        anger
## 8883            asshole      disgust
## 8884            asshole     negative
## 8885              lines         fear
## 8886             change         fear
## 8887               real     positive
## 8888               real        trust
## 8889               cold     negative
## 8890               real     positive
## 8891               real        trust
## 8892             change         fear
## 8893                top anticipation
## 8894                top     positive
## 8895                top        trust
## 8896             change         fear
## 8897          desperate     negative
## 8898                pay anticipation
## 8899                pay          joy
## 8900                pay     positive
## 8901                pay        trust
## 8902           increase     positive
## 8903               land     positive
## 8904           increase     positive
## 8905               land     positive
## 8906             horror        anger
## 8907             horror      disgust
## 8908             horror         fear
## 8909             horror     negative
## 8910             horror      sadness
## 8911             horror     surprise
## 8912              happy anticipation
## 8913              happy          joy
## 8914              happy     positive
## 8915              happy        trust
## 8916               time anticipation
## 8917              start anticipation
## 8918            killing        anger
## 8919            killing         fear
## 8920            killing     negative
## 8921            killing      sadness
## 8922              guess     surprise
## 8923               land     positive
## 8924           increase     positive
## 8925               land     positive
## 8926           nonsense     negative
## 8927            idiotic        anger
## 8928            idiotic      disgust
## 8929            idiotic     negative
## 8930              money        anger
## 8931              money anticipation
## 8932              money          joy
## 8933              money     positive
## 8934              money     surprise
## 8935              money        trust
## 8936              wrong     negative
## 8937           disaster        anger
## 8938           disaster      disgust
## 8939           disaster         fear
## 8940           disaster     negative
## 8941           disaster      sadness
## 8942           disaster     surprise
## 8943          protected        trust
## 8944               gain anticipation
## 8945               gain          joy
## 8946               gain     positive
## 8947        experienced     positive
## 8948        experienced        trust
## 8949               shit        anger
## 8950               shit      disgust
## 8951               shit     negative
## 8952               late     negative
## 8953               late      sadness
## 8954           collapse      disgust
## 8955           collapse         fear
## 8956           collapse     negative
## 8957           collapse      sadness
## 8958             chance     surprise
## 8959               real     positive
## 8960               real        trust
## 8961                war         fear
## 8962                war     negative
## 8963             steady     surprise
## 8964             steady        trust
## 8965           decrease     negative
## 8966          resources          joy
## 8967          resources     positive
## 8968          resources        trust
## 8969               food          joy
## 8970               food     positive
## 8971               food        trust
## 8972           decrease     negative
## 8973           pandemic         fear
## 8974           pandemic     negative
## 8975           pandemic      sadness
## 8976           collapse      disgust
## 8977           collapse         fear
## 8978           collapse     negative
## 8979           collapse      sadness
## 8980             change         fear
## 8981           personal        trust
## 8982               real     positive
## 8983               real        trust
## 8984               hate        anger
## 8985               hate      disgust
## 8986               hate         fear
## 8987               hate     negative
## 8988               hate      sadness
## 8989             reason     positive
## 8990              wrong     negative
## 8991              devil        anger
## 8992              devil anticipation
## 8993              devil      disgust
## 8994              devil         fear
## 8995              devil     negative
## 8996              devil      sadness
## 8997              shame      disgust
## 8998              shame         fear
## 8999              shame     negative
## 9000              shame      sadness
## 9001              wrong     negative
## 9002              worse         fear
## 9003              worse     negative
## 9004              worse      sadness
## 9005              wrong     negative
## 9006              pride          joy
## 9007              pride     positive
## 9008         depressing      disgust
## 9009         depressing     negative
## 9010         depressing      sadness
## 9011               hell        anger
## 9012               hell      disgust
## 9013               hell         fear
## 9014               hell     negative
## 9015               hell      sadness
## 9016              money        anger
## 9017              money anticipation
## 9018              money          joy
## 9019              money     positive
## 9020              money     surprise
## 9021              money        trust
## 9022             change         fear
## 9023             denial     negative
## 9024              guilt      disgust
## 9025              guilt     negative
## 9026              guilt      sadness
## 9027               real     positive
## 9028               real        trust
## 9029                bad        anger
## 9030                bad      disgust
## 9031                bad         fear
## 9032                bad     negative
## 9033                bad      sadness
## 9034           vacation anticipation
## 9035           vacation          joy
## 9036           vacation     positive
## 9037        responsible     positive
## 9038        responsible        trust
## 9039         destroying        anger
## 9040         destroying         fear
## 9041         destroying     negative
## 9042         destroying      sadness
## 9043            perfect anticipation
## 9044            perfect          joy
## 9045            perfect     positive
## 9046            perfect        trust
## 9047              level     positive
## 9048              level        trust
## 9049           personal        trust
## 9050             denial     negative
## 9051             change         fear
## 9052               fake     negative
## 9053               real     positive
## 9054               real        trust
## 9055              truth     positive
## 9056              truth        trust
## 9057          willingly     positive
## 9058             change         fear
## 9059             denial     negative
## 9060        catastrophe        anger
## 9061        catastrophe      disgust
## 9062        catastrophe         fear
## 9063        catastrophe     negative
## 9064        catastrophe      sadness
## 9065        catastrophe     surprise
## 9066             motion anticipation
## 9067              worry anticipation
## 9068              worry         fear
## 9069              worry     negative
## 9070              worry      sadness
## 9071               true          joy
## 9072               true     positive
## 9073               true        trust
## 9074               seek anticipation
## 9075             wealth          joy
## 9076             wealth     positive
## 9077             wealth        trust
## 9078             lament      disgust
## 9079             lament         fear
## 9080             lament     negative
## 9081             lament      sadness
## 9082             excuse     negative
## 9083           idealism     positive
## 9084             sucker        anger
## 9085             sucker     negative
## 9086              money        anger
## 9087              money anticipation
## 9088              money          joy
## 9089              money     positive
## 9090              money     surprise
## 9091              money        trust
## 9092              beach          joy
## 9093               real     positive
## 9094               real        trust
## 9095             nation        trust
## 9096              money        anger
## 9097              money anticipation
## 9098              money          joy
## 9099              money     positive
## 9100              money     surprise
## 9101              money        trust
## 9102               risk anticipation
## 9103               risk         fear
## 9104               risk     negative
## 9105              lying        anger
## 9106              lying      disgust
## 9107              lying     negative
## 9108              argue        anger
## 9109              argue     negative
## 9110              money        anger
## 9111              money anticipation
## 9112              money          joy
## 9113              money     positive
## 9114              money     surprise
## 9115              money        trust
## 9116               real     positive
## 9117               real        trust
## 9118             forget     negative
## 9119             change         fear
## 9120               real     positive
## 9121               real        trust
## 9122               harm         fear
## 9123               harm     negative
## 9124               real     positive
## 9125               real        trust
## 9126                bad        anger
## 9127                bad      disgust
## 9128                bad         fear
## 9129                bad     negative
## 9130                bad      sadness
## 9131              faith anticipation
## 9132              faith          joy
## 9133              faith     positive
## 9134              faith        trust
## 9135                bad        anger
## 9136                bad      disgust
## 9137                bad         fear
## 9138                bad     negative
## 9139                bad      sadness
## 9140              faith anticipation
## 9141              faith          joy
## 9142              faith     positive
## 9143              faith        trust
## 9144             denial     negative
## 9145              fault     negative
## 9146              fault      sadness
## 9147               lack     negative
## 9148                bad        anger
## 9149                bad      disgust
## 9150                bad         fear
## 9151                bad     negative
## 9152                bad      sadness
## 9153              faith anticipation
## 9154              faith          joy
## 9155              faith     positive
## 9156              faith        trust
## 9157                bad        anger
## 9158                bad      disgust
## 9159                bad         fear
## 9160                bad     negative
## 9161                bad      sadness
## 9162              faith anticipation
## 9163              faith          joy
## 9164              faith     positive
## 9165              faith        trust
## 9166            knowing     positive
## 9167                bad        anger
## 9168                bad      disgust
## 9169                bad         fear
## 9170                bad     negative
## 9171                bad      sadness
## 9172              faith anticipation
## 9173              faith          joy
## 9174              faith     positive
## 9175              faith        trust
## 9176               true          joy
## 9177               true     positive
## 9178               true        trust
## 9179          pollution      disgust
## 9180          pollution     negative
## 9181             enrich     positive
## 9182            slavery        anger
## 9183            slavery      disgust
## 9184            slavery         fear
## 9185            slavery     negative
## 9186            slavery      sadness
## 9187            obvious     positive
## 9188            obvious        trust
## 9189              words        anger
## 9190              words     negative
## 9191            obvious     positive
## 9192            obvious        trust
## 9193            granted     positive
## 9194               vote        anger
## 9195               vote anticipation
## 9196               vote          joy
## 9197               vote     negative
## 9198               vote     positive
## 9199               vote      sadness
## 9200               vote     surprise
## 9201               vote        trust
## 9202               shit        anger
## 9203               shit      disgust
## 9204               shit     negative
## 9205            culture     positive
## 9206             actual     positive
## 9207              pride          joy
## 9208              pride     positive
## 9209             rugged     negative
## 9210               kill         fear
## 9211               kill     negative
## 9212               kill      sadness
## 9213           sanitary     positive
## 9214               shit        anger
## 9215               shit      disgust
## 9216               shit     negative
## 9217               shit        anger
## 9218               shit      disgust
## 9219               shit     negative
## 9220          defending     positive
## 9221         overpriced        anger
## 9222         overpriced      disgust
## 9223         overpriced     negative
## 9224         overpriced      sadness
## 9225              awful        anger
## 9226              awful      disgust
## 9227              awful         fear
## 9228              awful     negative
## 9229              awful      sadness
## 9230               wait anticipation
## 9231               wait     negative
## 9232              lower     negative
## 9233              lower      sadness
## 9234            pollute      disgust
## 9235            pollute     negative
## 9236          convinced        trust
## 9237              truck        trust
## 9238              tough     negative
## 9239              tough      sadness
## 9240            screech         fear
## 9241            screech     negative
## 9242            screech     surprise
## 9243             coming anticipation
## 9244            manhood     positive
## 9245               dare anticipation
## 9246               dare        trust
## 9247          dependent     negative
## 9248          dependent     positive
## 9249          dependent        trust
## 9250             public anticipation
## 9251             public     positive
## 9252             motive     positive
## 9253        reactionary     negative
## 9254         allegiance     positive
## 9255         allegiance        trust
## 9256               deny        anger
## 9257               deny     negative
## 9258             change         fear
## 9259            denying anticipation
## 9260            denying     negative
## 9261               deny        anger
## 9262               deny     negative
## 9263           worrying anticipation
## 9264           worrying         fear
## 9265           worrying     negative
## 9266           worrying      sadness
## 9267             change         fear
## 9268            liberal     negative
## 9269            liberal     positive
## 9270          knowledge     positive
## 9271             denial     negative
## 9272             lunacy        anger
## 9273             lunacy      disgust
## 9274             lunacy         fear
## 9275             lunacy     negative
## 9276             lunacy      sadness
## 9277                don     positive
## 9278                don        trust
## 9279             stroke         fear
## 9280             stroke     negative
## 9281             stroke      sadness
## 9282           reliance     positive
## 9283           reliance        trust
## 9284              lucky          joy
## 9285              lucky     positive
## 9286              lucky     surprise
## 9287         government         fear
## 9288         government     negative
## 9289         accelerate anticipation
## 9290             coming anticipation
## 9291             threat        anger
## 9292             threat         fear
## 9293             threat     negative
## 9294              money        anger
## 9295              money anticipation
## 9296              money          joy
## 9297              money     positive
## 9298              money     surprise
## 9299              money        trust
## 9300               fear        anger
## 9301               fear         fear
## 9302               fear     negative
## 9303           terribly      sadness
## 9304              worse         fear
## 9305              worse     negative
## 9306              worse      sadness
## 9307              dread anticipation
## 9308              dread         fear
## 9309              dread     negative
## 9310           confront        anger
## 9311         pretending        anger
## 9312         pretending     negative
## 9313               real     positive
## 9314               real        trust
## 9315            pretend     negative
## 9316           blissful          joy
## 9317           blissful     positive
## 9318                don     positive
## 9319                don        trust
## 9320          cognitive     positive
## 9321         dissonance        anger
## 9322         dissonance     negative
## 9323             pretty anticipation
## 9324             pretty          joy
## 9325             pretty     positive
## 9326             pretty        trust
## 9327              tough     negative
## 9328              tough      sadness
## 9329              anger        anger
## 9330              anger     negative
## 9331              brawl        anger
## 9332              brawl      disgust
## 9333              brawl         fear
## 9334              brawl     negative
## 9335                don     positive
## 9336                don        trust
## 9337             change         fear
## 9338             change         fear
## 9339               real     positive
## 9340               real        trust
## 9341                don     positive
## 9342                don        trust
## 9343               love          joy
## 9344               love     positive
## 9345               mill anticipation
## 9346          concerned         fear
## 9347          concerned      sadness
## 9348             change         fear
## 9349               real     positive
## 9350               real        trust
## 9351             agreed     positive
## 9352             agreed        trust
## 9353           confront        anger
## 9354            immense     positive
## 9355           disaster        anger
## 9356           disaster      disgust
## 9357           disaster         fear
## 9358           disaster     negative
## 9359           disaster      sadness
## 9360           disaster     surprise
## 9361            horizon anticipation
## 9362            horizon     positive
## 9363            liberal     negative
## 9364            liberal     positive
## 9365               real     positive
## 9366               real        trust
## 9367                sea     positive
## 9368              worse         fear
## 9369              worse     negative
## 9370              worse      sadness
## 9371               lead     positive
## 9372              avoid         fear
## 9373              avoid     negative
## 9374          unhealthy      disgust
## 9375          unhealthy         fear
## 9376          unhealthy     negative
## 9377          unhealthy      sadness
## 9378            leaning        trust
## 9379           believed        trust
## 9380              lucky          joy
## 9381              lucky     positive
## 9382              lucky     surprise
## 9383             rescue anticipation
## 9384             rescue          joy
## 9385             rescue     positive
## 9386             rescue     surprise
## 9387             rescue        trust
## 9388             change         fear
## 9389                bad        anger
## 9390                bad      disgust
## 9391                bad         fear
## 9392                bad     negative
## 9393                bad      sadness
## 9394           pressure     negative
## 9395                don     positive
## 9396                don        trust
## 9397               save          joy
## 9398               save     positive
## 9399               save        trust
## 9400               fair     positive
## 9401            liberal     negative
## 9402            liberal     positive
## 9403               vote        anger
## 9404               vote anticipation
## 9405               vote          joy
## 9406               vote     negative
## 9407               vote     positive
## 9408               vote      sadness
## 9409               vote     surprise
## 9410               vote        trust
## 9411          candidate     positive
## 9412               deny        anger
## 9413               deny     negative
## 9414               risk anticipation
## 9415               risk         fear
## 9416               risk     negative
## 9417               real     positive
## 9418               real        trust
## 9419               fear        anger
## 9420               fear         fear
## 9421               fear     negative
## 9422               blue      sadness
## 9423           argument        anger
## 9424           argument     negative
## 9425               wild     negative
## 9426               wild     surprise
## 9427         conspiracy         fear
## 9428           paranoia         fear
## 9429           paranoia     negative
## 9430         government         fear
## 9431         government     negative
## 9432                ban     negative
## 9433        agriculture     positive
## 9434         completely     positive
## 9435           horribly     negative
## 9436              labor anticipation
## 9437              labor          joy
## 9438              labor     positive
## 9439              labor     surprise
## 9440              labor        trust
## 9441             nation        trust
## 9442           beholden     negative
## 9443           powerful        anger
## 9444           powerful anticipation
## 9445           powerful      disgust
## 9446           powerful         fear
## 9447           powerful          joy
## 9448           powerful     positive
## 9449           powerful        trust
## 9450           beholden     negative
## 9451             growth     positive
## 9452             crisis     negative
## 9453               deal anticipation
## 9454               deal          joy
## 9455               deal     positive
## 9456               deal     surprise
## 9457               deal        trust
## 9458              agree     positive
## 9459               lost     negative
## 9460               lost      sadness
## 9461                don     positive
## 9462                don        trust
## 9463              dread anticipation
## 9464              dread         fear
## 9465              dread     negative
## 9466                don     positive
## 9467                don        trust
## 9468              tough     negative
## 9469              tough      sadness
## 9470             reason     positive
## 9471         conspiracy         fear
## 9472            benefit     positive
## 9473            liberal     negative
## 9474            liberal     positive
## 9475                don     positive
## 9476                don        trust
## 9477            blindly     negative
## 9478            blindly      sadness
## 9479                don     positive
## 9480                don        trust
## 9481             reason     positive
## 9482             change         fear
## 9483             change         fear
## 9484         ultimately anticipation
## 9485         ultimately     positive
## 9486             system        trust
## 9487             status     positive
## 9488             public anticipation
## 9489             public     positive
## 9490          skeptical     negative
## 9491           humanity          joy
## 9492           humanity     positive
## 9493           humanity        trust
## 9494        responsible     positive
## 9495        responsible        trust
## 9496              vague     negative
## 9497            justice     positive
## 9498            justice        trust
## 9499            fulfill          joy
## 9500            fulfill     positive
## 9501               debt     negative
## 9502               debt      sadness
## 9503               time anticipation
## 9504              money        anger
## 9505              money anticipation
## 9506              money          joy
## 9507              money     positive
## 9508              money     surprise
## 9509              money        trust
## 9510     disinformation        anger
## 9511     disinformation         fear
## 9512     disinformation     negative
## 9513              cheap     negative
## 9514              cheap     negative
## 9515              enemy        anger
## 9516              enemy      disgust
## 9517              enemy         fear
## 9518              enemy     negative
## 9519                eat     positive
## 9520         discussion     positive
## 9521               love          joy
## 9522               love     positive
## 9523               shit        anger
## 9524               shit      disgust
## 9525               shit     negative
## 9526               hoax        anger
## 9527               hoax      disgust
## 9528               hoax     negative
## 9529               hoax      sadness
## 9530               hoax     surprise
## 9531         discussion     positive
## 9532             rooted     positive
## 9533             rooted        trust
## 9534         conspiracy         fear
## 9535               fake     negative
## 9536              greed        anger
## 9537              greed      disgust
## 9538              greed     negative
## 9539           powerful        anger
## 9540           powerful anticipation
## 9541           powerful      disgust
## 9542           powerful         fear
## 9543           powerful          joy
## 9544           powerful     positive
## 9545           powerful        trust
## 9546            disease        anger
## 9547            disease      disgust
## 9548            disease         fear
## 9549            disease     negative
## 9550            disease      sadness
## 9551             nation        trust
## 9552             combat        anger
## 9553             combat         fear
## 9554             combat     negative
## 9555            disease        anger
## 9556            disease      disgust
## 9557            disease         fear
## 9558            disease     negative
## 9559            disease      sadness
## 9560              serve     negative
## 9561              serve        trust
## 9562             nation        trust
## 9563               hide         fear
## 9564               hide         fear
## 9565              fight        anger
## 9566              fight         fear
## 9567              fight     negative
## 9568       reproductive          joy
## 9569       reproductive     positive
## 9570                bad        anger
## 9571                bad      disgust
## 9572                bad         fear
## 9573                bad     negative
## 9574                bad      sadness
## 9575                bad        anger
## 9576                bad      disgust
## 9577                bad         fear
## 9578                bad     negative
## 9579                bad      sadness
## 9580              fight        anger
## 9581              fight         fear
## 9582              fight     negative
## 9583               luck anticipation
## 9584               luck          joy
## 9585               luck     positive
## 9586               luck     surprise
## 9587               talk     positive
## 9588              fight        anger
## 9589              fight         fear
## 9590              fight     negative
## 9591              sense     positive
## 9592              crave anticipation
## 9593          attention     positive
## 9594               fear        anger
## 9595               fear         fear
## 9596               fear     negative
## 9597         sacrifices      disgust
## 9598         sacrifices         fear
## 9599         sacrifices     negative
## 9600         sacrifices      sadness
## 9601                top anticipation
## 9602                top     positive
## 9603                top        trust
## 9604           cleaning     positive
## 9605               hurt        anger
## 9606               hurt         fear
## 9607               hurt     negative
## 9608               hurt      sadness
## 9609             bottom     negative
## 9610             bottom      sadness
## 9611               vote        anger
## 9612               vote anticipation
## 9613               vote          joy
## 9614               vote     negative
## 9615               vote     positive
## 9616               vote      sadness
## 9617               vote     surprise
## 9618               vote        trust
## 9619             united     positive
## 9620             united        trust
## 9621              blast        anger
## 9622              blast         fear
## 9623              blast     negative
## 9624              blast     surprise
## 9625             lesser      disgust
## 9626             lesser     negative
## 9627           educated     positive
## 9628               fall     negative
## 9629               fall      sadness
## 9630           continue anticipation
## 9631           continue     positive
## 9632           continue        trust
## 9633        information     positive
## 9634               food          joy
## 9635               food     positive
## 9636               food        trust
## 9637             degree     positive
## 9638              legal     positive
## 9639              legal        trust
## 9640              legal     positive
## 9641              legal        trust
## 9642         discourage         fear
## 9643         discourage     negative
## 9644         discourage      sadness
## 9645                fun anticipation
## 9646                fun          joy
## 9647                fun     positive
## 9648          pollution      disgust
## 9649          pollution     negative
## 9650              proud anticipation
## 9651              proud          joy
## 9652              proud     positive
## 9653              proud        trust
## 9654               lack     negative
## 9655            empathy     positive
## 9656           religion        trust
## 9657           optimism anticipation
## 9658           optimism          joy
## 9659           optimism     positive
## 9660           optimism     surprise
## 9661           optimism        trust
## 9662                god anticipation
## 9663                god         fear
## 9664                god          joy
## 9665                god     positive
## 9666                god        trust
## 9667               plan anticipation
## 9668          organized     positive
## 9669         fanaticism         fear
## 9670             actual     positive
## 9671            opposed        anger
## 9672            opposed         fear
## 9673            opposed     negative
## 9674               fear        anger
## 9675               fear         fear
## 9676               fear     negative
## 9677             change         fear
## 9678            unknown anticipation
## 9679            unknown         fear
## 9680            unknown     negative
## 9681            pretend     negative
## 9682           negative     negative
## 9683           negative      sadness
## 9684             happen anticipation
## 9685             change         fear
## 9686             denial     negative
## 9687               team        trust
## 9688               team        trust
## 9689                bad        anger
## 9690                bad      disgust
## 9691                bad         fear
## 9692                bad     negative
## 9693                bad      sadness
## 9694         propaganda     negative
## 9695              level     positive
## 9696              level        trust
## 9697              happy anticipation
## 9698              happy          joy
## 9699              happy     positive
## 9700              happy        trust
## 9701            denying anticipation
## 9702            denying     negative
## 9703          agreeable     positive
## 9704          agreeable        trust
## 9705              greed        anger
## 9706              greed      disgust
## 9707              greed     negative
## 9708              lying        anger
## 9709              lying      disgust
## 9710              lying     negative
## 9711             change         fear
## 9712             change         fear
## 9713                don     positive
## 9714                don        trust
## 9715        destruction        anger
## 9716        destruction     negative
## 9717               fear        anger
## 9718               fear         fear
## 9719               fear     negative
## 9720            respite          joy
## 9721            respite     positive
## 9722            respite        trust
## 9723          believing     positive
## 9724          believing        trust
## 9725            liberal     negative
## 9726            liberal     positive
## 9727               hoax        anger
## 9728               hoax      disgust
## 9729               hoax     negative
## 9730               hoax      sadness
## 9731               hoax     surprise
## 9732               vote        anger
## 9733               vote anticipation
## 9734               vote          joy
## 9735               vote     negative
## 9736               vote     positive
## 9737               vote      sadness
## 9738               vote     surprise
## 9739               vote        trust
## 9740         resentment        anger
## 9741         resentment      disgust
## 9742         resentment     negative
## 9743         resentment      sadness
## 9744                mad        anger
## 9745                mad      disgust
## 9746                mad         fear
## 9747                mad     negative
## 9748                mad      sadness
## 9749             status     positive
## 9750              petty     negative
## 9751              elite anticipation
## 9752              elite          joy
## 9753              elite     positive
## 9754              elite        trust
## 9755                bad        anger
## 9756                bad      disgust
## 9757                bad         fear
## 9758                bad     negative
## 9759                bad      sadness
## 9760            pretend     negative
## 9761                bad        anger
## 9762                bad      disgust
## 9763                bad         fear
## 9764                bad     negative
## 9765                bad      sadness
## 9766                bad        anger
## 9767                bad      disgust
## 9768                bad         fear
## 9769                bad     negative
## 9770                bad      sadness
## 9771             forget     negative
## 9772          necessity      sadness
## 9773       hypocritical      disgust
## 9774       hypocritical     negative
## 9775             flying         fear
## 9776             flying     positive
## 9777             dinner     positive
## 9778               shit        anger
## 9779               shit      disgust
## 9780               shit     negative
## 9781               shit        anger
## 9782               shit      disgust
## 9783               shit     negative
## 9784            monster         fear
## 9785            monster     negative
## 9786                hot        anger
## 9787             change         fear
## 9788               cold     negative
## 9789             change         fear
## 9790             change         fear
## 9791             change         fear
## 9792             change         fear
## 9793             change         fear
## 9794               lack     negative
## 9795                sun anticipation
## 9796                sun          joy
## 9797                sun     positive
## 9798                sun     surprise
## 9799                sun        trust
## 9800              giant         fear
## 9801             create          joy
## 9802             create     positive
## 9803        catastrophe        anger
## 9804        catastrophe      disgust
## 9805        catastrophe         fear
## 9806        catastrophe     negative
## 9807        catastrophe      sadness
## 9808        catastrophe     surprise
## 9809              clean          joy
## 9810              clean     positive
## 9811              clean        trust
## 9812          hypocrisy     negative
## 9813             threat        anger
## 9814             threat         fear
## 9815             threat     negative
## 9816               safe          joy
## 9817               safe     positive
## 9818               safe        trust
## 9819              clean          joy
## 9820              clean     positive
## 9821              clean        trust
## 9822           abundant          joy
## 9823           abundant     positive
## 9824             expect anticipation
## 9825             expect     positive
## 9826             expect     surprise
## 9827             expect        trust
## 9828             coming anticipation
## 9829              start anticipation
## 9830              start anticipation
## 9831               crap      disgust
## 9832               crap     negative
## 9833             cancer        anger
## 9834             cancer      disgust
## 9835             cancer         fear
## 9836             cancer     negative
## 9837             cancer      sadness
## 9838               shit        anger
## 9839               shit      disgust
## 9840               shit     negative
## 9841            failure      disgust
## 9842            failure         fear
## 9843            failure     negative
## 9844            failure      sadness
## 9845            explain     positive
## 9846            explain        trust
## 9847          skeptical     negative
## 9848             actual     positive
## 9849          difficult         fear
## 9850         impossible     negative
## 9851         impossible      sadness
## 9852             theory anticipation
## 9853             theory        trust
## 9854            falsify      disgust
## 9855            falsify     negative
## 9856              build     positive
## 9857              prove     positive
## 9858             result anticipation
## 9859         impossible     negative
## 9860         impossible      sadness
## 9861             change         fear
## 9862               base        trust
## 9863            physics     positive
## 9864            perfect anticipation
## 9865            perfect          joy
## 9866            perfect     positive
## 9867            perfect        trust
## 9868        speculative anticipation
## 9869              doubt         fear
## 9870              doubt     negative
## 9871              doubt      sadness
## 9872              doubt        trust
## 9873           accurate     positive
## 9874           accurate        trust
## 9875        calculating     negative
## 9876            measure        trust
## 9877              prove     positive
## 9878           accurate     positive
## 9879           accurate        trust
## 9880            suggest        trust
## 9881              prove     positive
## 9882               love          joy
## 9883               love     positive
## 9884           efficacy     positive
## 9885            predict anticipation
## 9886            measure        trust
## 9887       mathematical        trust
## 9888             actual     positive
## 9889            dynamic     surprise
## 9890             change         fear
## 9891          scientist anticipation
## 9892          scientist     positive
## 9893          scientist        trust
## 9894         hypothesis anticipation
## 9895         hypothesis     surprise
## 9896            suspect         fear
## 9897            suspect     negative
## 9898              adapt     positive
## 9899           confined        anger
## 9900           confined      disgust
## 9901           confined         fear
## 9902           confined     negative
## 9903           confined      sadness
## 9904              rapid     surprise
## 9905           educated     positive
## 9906          objection        anger
## 9907          objection     negative
## 9908              merit     positive
## 9909              merit        trust
## 9910            madness        anger
## 9911            madness         fear
## 9912            madness     negative
## 9913          confident          joy
## 9914          confident     positive
## 9915          confident        trust
## 9916               holy     positive
## 9917               shit        anger
## 9918               shit      disgust
## 9919               shit     negative
## 9920            madness        anger
## 9921            madness         fear
## 9922            madness     negative
## 9923           doubtful     negative
## 9924              proof        trust
## 9925              blame        anger
## 9926              blame      disgust
## 9927              blame     negative
## 9928            madness        anger
## 9929            madness         fear
## 9930            madness     negative
## 9931             excuse     negative
## 9932            subject     negative
## 9933              proof        trust
## 9934              blame        anger
## 9935              blame      disgust
## 9936              blame     negative
## 9937             denial     negative
## 9938             denial     negative
## 9939              truth     positive
## 9940              truth        trust
## 9941             denied     negative
## 9942             denied      sadness
## 9943             change         fear
## 9944           question     positive
## 9945           veracity anticipation
## 9946           veracity          joy
## 9947           veracity     positive
## 9948           veracity     surprise
## 9949           veracity        trust
## 9950              child anticipation
## 9951              child          joy
## 9952              child     positive
## 9953          screaming        anger
## 9954          screaming      disgust
## 9955          screaming         fear
## 9956          screaming     negative
## 9957               dare anticipation
## 9958               dare        trust
## 9959           question     positive
## 9960             degree     positive
## 9961              blame        anger
## 9962              blame      disgust
## 9963              blame     negative
## 9964         prediction anticipation
## 9965             untrue     negative
## 9966         surpassing     positive
## 9967           increase     positive
## 9968         impossible     negative
## 9969         impossible      sadness
## 9970            predict anticipation
## 9971              sense     positive
## 9972             happen anticipation
## 9973             happen anticipation
## 9974               time anticipation
## 9975             happen anticipation
## 9976          expecting anticipation
## 9977            predict anticipation
## 9978           absolute     positive
## 9979          certainty     positive
## 9980              wrong     negative
## 9981              daily anticipation
## 9982            predict anticipation
## 9983           absolute     positive
## 9984          certainty     positive
## 9985             change         fear
## 9986                bad        anger
## 9987                bad      disgust
## 9988                bad         fear
## 9989                bad     negative
## 9990                bad      sadness
## 9991             happen anticipation
## 9992              level     positive
## 9993              level        trust
## 9994         accomplish          joy
## 9995         accomplish     positive
## 9996               john      disgust
## 9997               john     negative
## 9998              start anticipation
## 9999        cooperating     positive
## 10000       cooperating        trust
## 10001            change         fear
## 10002              time anticipation
## 10003         operation         fear
## 10004         operation        trust
## 10005             worse         fear
## 10006             worse     negative
## 10007             worse      sadness
## 10008            change         fear
## 10009               ass     negative
## 10010            change         fear
## 10011             watch anticipation
## 10012             watch         fear
## 10013         hyperbole     negative
## 10014              time anticipation
## 10015             begun anticipation
## 10016          continue anticipation
## 10017          continue     positive
## 10018          continue        trust
## 10019              time anticipation
## 10020             offer     positive
## 10021              time anticipation
## 10022           predict anticipation
## 10023         incorrect     negative
## 10024            change         fear
## 10025          question     positive
## 10026          question     positive
## 10027             force        anger
## 10028             force         fear
## 10029             force     negative
## 10030           suggest        trust
## 10031            invade        anger
## 10032            invade         fear
## 10033            invade     negative
## 10034            invade      sadness
## 10035            invade     surprise
## 10036          argument        anger
## 10037          argument     negative
## 10038             sense     positive
## 10039         hyperbole     negative
## 10040          continue anticipation
## 10041          continue     positive
## 10042          continue        trust
## 10043             worse         fear
## 10044             worse     negative
## 10045             worse      sadness
## 10046         worsening      disgust
## 10047         worsening     negative
## 10048         worsening      sadness
## 10049        accelerate anticipation
## 10050      disingenuous      disgust
## 10051      disingenuous     negative
## 10052        population     positive
## 10053            united     positive
## 10054            united        trust
## 10055          measured     positive
## 10056          measured        trust
## 10057             worry anticipation
## 10058             worry         fear
## 10059             worry     negative
## 10060             worry      sadness
## 10061              dire      disgust
## 10062              dire         fear
## 10063              dire     negative
## 10064              dire      sadness
## 10065              dire     surprise
## 10066       catastrophe        anger
## 10067       catastrophe      disgust
## 10068       catastrophe         fear
## 10069       catastrophe     negative
## 10070       catastrophe      sadness
## 10071       catastrophe     surprise
## 10072               sky     positive
## 10073           falling     negative
## 10074           falling      sadness
## 10075              king     positive
## 10076             start anticipation
## 10077             force        anger
## 10078             force         fear
## 10079             force     negative
## 10080           classic     positive
## 10081             money        anger
## 10082             money anticipation
## 10083             money          joy
## 10084             money     positive
## 10085             money     surprise
## 10086             money        trust
## 10087        technology     positive
## 10088            happen anticipation
## 10089            happen anticipation
## 10090              time anticipation
## 10091              bomb        anger
## 10092              bomb         fear
## 10093              bomb     negative
## 10094              bomb      sadness
## 10095              bomb     surprise
## 10096            damage        anger
## 10097            damage      disgust
## 10098            damage     negative
## 10099            damage      sadness
## 10100              time anticipation
## 10101          increase     positive
## 10102              time anticipation
## 10103          advocate        trust
## 10104            pretty anticipation
## 10105            pretty          joy
## 10106            pretty     positive
## 10107            pretty        trust
## 10108          question     positive
## 10109             prove     positive
## 10110            actual     positive
## 10111            debate     positive
## 10112            change         fear
## 10113            debate     positive
## 10114      disingenuous      disgust
## 10115      disingenuous     negative
## 10116         statement     positive
## 10117         statement        trust
## 10118            pretty anticipation
## 10119            pretty          joy
## 10120            pretty     positive
## 10121            pretty        trust
## 10122            change         fear
## 10123        uninformed     negative
## 10124             leave     negative
## 10125             leave      sadness
## 10126             leave     surprise
## 10127        uninformed     negative
## 10128              time anticipation
## 10129            change         fear
## 10130         concerned         fear
## 10131         concerned      sadness
## 10132              dank      disgust
## 10133            alerts anticipation
## 10134            alerts         fear
## 10135            alerts     surprise
## 10136             guess     surprise
## 10137            arrest     negative
## 10138            change         fear
## 10139             weeds     negative
## 10140             weeds      sadness
## 10141         scientist anticipation
## 10142         scientist     positive
## 10143         scientist        trust
## 10144             weeds     negative
## 10145             weeds      sadness
## 10146           opposed        anger
## 10147           opposed         fear
## 10148           opposed     negative
## 10149         producing     positive
## 10150           related        trust
## 10151         scientist anticipation
## 10152         scientist     positive
## 10153         scientist        trust
## 10154         scientist anticipation
## 10155         scientist     positive
## 10156         scientist        trust
## 10157      overwhelming     positive
## 10158        scientific     positive
## 10159        scientific        trust
## 10160        conspiracy         fear
## 10161           reading     positive
## 10162        contribute     positive
## 10163            ignore     negative
## 10164             ahead     positive
## 10165             prove     positive
## 10166               bad        anger
## 10167               bad      disgust
## 10168               bad         fear
## 10169               bad     negative
## 10170               bad      sadness
## 10171            exceed anticipation
## 10172            exceed          joy
## 10173            exceed     positive
## 10174           dubious         fear
## 10175           dubious     negative
## 10176           dubious        trust
## 10177             start anticipation
## 10178              fool      disgust
## 10179              fool     negative
## 10180              joke     negative
## 10181              joke     negative
## 10182               sir     positive
## 10183               sir        trust
## 10184          learning     positive
## 10185        scientific     positive
## 10186        scientific        trust
## 10187            nation        trust
## 10188             wrong     negative
## 10189            change         fear
## 10190              real     positive
## 10191              real        trust
## 10192         dangerous         fear
## 10193         dangerous     negative
## 10194              fake     negative
## 10195            honest        anger
## 10196            honest      disgust
## 10197            honest         fear
## 10198            honest          joy
## 10199            honest     positive
## 10200            honest      sadness
## 10201            honest        trust
## 10202              time anticipation
## 10203              lost     negative
## 10204              lost      sadness
## 10205              save          joy
## 10206              save     positive
## 10207              save        trust
## 10208              time anticipation
## 10209               top anticipation
## 10210               top     positive
## 10211               top        trust
## 10212               top anticipation
## 10213               top     positive
## 10214               top        trust
## 10215          educated     positive
## 10216           chemist     positive
## 10217           chemist        trust
## 10218              beer          joy
## 10219              beer     positive
## 10220         knowledge     positive
## 10221            change         fear
## 10222         physicist        trust
## 10223            notion     positive
## 10224             agree     positive
## 10225             proof        trust
## 10226          politics        anger
## 10227           reserve     positive
## 10228          judgment     surprise
## 10229              word     positive
## 10230              word        trust
## 10231               top anticipation
## 10232               top     positive
## 10233               top        trust
## 10234          educated     positive
## 10235           chemist     positive
## 10236           chemist        trust
## 10237              beer          joy
## 10238              beer     positive
## 10239         knowledge     positive
## 10240            change         fear
## 10241         scientist anticipation
## 10242         scientist     positive
## 10243         scientist        trust
## 10244     preponderance        trust
## 10245          relevant     positive
## 10246          relevant        trust
## 10247        scientific     positive
## 10248        scientific        trust
## 10249            notion     positive
## 10250            change         fear
## 10251         physicist        trust
## 10252            notion     positive
## 10253             agree     positive
## 10254             proof        trust
## 10255             proof        trust
## 10256            change         fear
## 10257             count     positive
## 10258             count        trust
## 10259             agree     positive
## 10260            change         fear
## 10261             agree     positive
## 10262            change         fear
## 10263             found          joy
## 10264             found     positive
## 10265             found        trust
## 10266        scientific     positive
## 10267        scientific        trust
## 10268             agree     positive
## 10269            change         fear
## 10270           related        trust
## 10271          agreeing     positive
## 10272          agreeing        trust
## 10273          agreeing     positive
## 10274          agreeing        trust
## 10275          politics        anger
## 10276           reserve     positive
## 10277          judgment     surprise
## 10278            change         fear
## 10279            proven        trust
## 10280              word     positive
## 10281              word        trust
## 10282              word     positive
## 10283              word        trust
## 10284             offer     positive
## 10285           wasting      disgust
## 10286           wasting         fear
## 10287           wasting     negative
## 10288           wasting      sadness
## 10289              time anticipation
## 10290            impart     positive
## 10291            impart        trust
## 10292             truth     positive
## 10293             truth        trust
## 10294               fun anticipation
## 10295               fun          joy
## 10296               fun     positive
## 10297               bad        anger
## 10298               bad      disgust
## 10299               bad         fear
## 10300               bad     negative
## 10301               bad      sadness
## 10302         arguments        anger
## 10303              luck anticipation
## 10304              luck          joy
## 10305              luck     positive
## 10306              luck     surprise
## 10307              time anticipation
## 10308              gore        anger
## 10309              gore      disgust
## 10310              gore         fear
## 10311              gore     negative
## 10312              gore      sadness
## 10313      inconvenient        anger
## 10314      inconvenient      disgust
## 10315      inconvenient     negative
## 10316      inconvenient      sadness
## 10317             truth     positive
## 10318             truth        trust
## 10319            change         fear
## 10320      hypocritical      disgust
## 10321      hypocritical     negative
## 10322           blatant        anger
## 10323           blatant      disgust
## 10324           blatant     negative
## 10325         hypocrisy     negative
## 10326            change         fear
## 10327              bank        trust
## 10328              hell        anger
## 10329              hell      disgust
## 10330              hell         fear
## 10331              hell     negative
## 10332              hell      sadness
## 10333             money        anger
## 10334             money anticipation
## 10335             money          joy
## 10336             money     positive
## 10337             money     surprise
## 10338             money        trust
## 10339             truth     positive
## 10340             truth        trust
## 10341           denying anticipation
## 10342           denying     negative
## 10343            change         fear
## 10344           dispute        anger
## 10345           dispute     negative
## 10346             found          joy
## 10347             found     positive
## 10348             found        trust
## 10349             watch anticipation
## 10350             watch         fear
## 10351             watch anticipation
## 10352             watch         fear
## 10353             watch anticipation
## 10354             watch         fear
## 10355             watch anticipation
## 10356             watch         fear
## 10357             watch anticipation
## 10358             watch         fear
## 10359             watch anticipation
## 10360             watch         fear
## 10361             watch anticipation
## 10362             watch         fear
## 10363             watch anticipation
## 10364             watch         fear
## 10365          question     positive
## 10366            change         fear
## 10367          ridicule        anger
## 10368          ridicule      disgust
## 10369          ridicule     negative
## 10370          ridicule      sadness
## 10371            stupid     negative
## 10372              evil        anger
## 10373              evil      disgust
## 10374              evil         fear
## 10375              evil     negative
## 10376              evil      sadness
## 10377               mad        anger
## 10378               mad      disgust
## 10379               mad         fear
## 10380               mad     negative
## 10381               mad      sadness
## 10382          humanity          joy
## 10383          humanity     positive
## 10384          humanity        trust
## 10385            cancer        anger
## 10386            cancer      disgust
## 10387            cancer         fear
## 10388            cancer     negative
## 10389            cancer      sadness
## 10390        constantly        trust
## 10391            result anticipation
## 10392               sky     positive
## 10393           falling     negative
## 10394           falling      sadness
## 10395         effective     positive
## 10396         effective        trust
## 10397          inspired          joy
## 10398          inspired     positive
## 10399          inspired     surprise
## 10400          inspired        trust
## 10401             build     positive
## 10402              land     positive
## 10403          humanity          joy
## 10404          humanity     positive
## 10405          humanity        trust
## 10406            damage        anger
## 10407            damage      disgust
## 10408            damage     negative
## 10409            damage      sadness
## 10410            change         fear
## 10411          advocate        trust
## 10412            hating        anger
## 10413            hating     negative
## 10414          humanity          joy
## 10415          humanity     positive
## 10416          humanity        trust
## 10417            change         fear
## 10418             crazy        anger
## 10419             crazy         fear
## 10420             crazy     negative
## 10421             crazy      sadness
## 10422        conspiracy         fear
## 10423            reason     positive
## 10424           vaccine     positive
## 10425            stupid     negative
## 10426              evil        anger
## 10427              evil      disgust
## 10428              evil         fear
## 10429              evil     negative
## 10430              evil      sadness
## 10431               mad        anger
## 10432               mad      disgust
## 10433               mad         fear
## 10434               mad     negative
## 10435               mad      sadness
## 10436          increase     positive
## 10437              true          joy
## 10438              true     positive
## 10439              true        trust
## 10440           invalid      sadness
## 10441              fair     positive
## 10442             guess     surprise
## 10443          doomsday        anger
## 10444          doomsday anticipation
## 10445          doomsday      disgust
## 10446          doomsday         fear
## 10447          doomsday     negative
## 10448          doomsday      sadness
## 10449              talk     positive
## 10450            actual     positive
## 10451              deny        anger
## 10452              deny     negative
## 10453            change         fear
## 10454           drought     negative
## 10455         pollution      disgust
## 10456         pollution     negative
## 10457         resilient     positive
## 10458         pollution      disgust
## 10459         pollution     negative
## 10460        scientific     positive
## 10461        scientific        trust
## 10462            faulty     negative
## 10463       destruction        anger
## 10464       destruction     negative
## 10465            change         fear
## 10466           warning         fear
## 10467            prefer     positive
## 10468            prefer        trust
## 10469            change         fear
## 10470               bad        anger
## 10471               bad      disgust
## 10472               bad         fear
## 10473               bad     negative
## 10474               bad      sadness
## 10475            happen anticipation
## 10476            change         fear
## 10477           miracle anticipation
## 10478           miracle          joy
## 10479           miracle     positive
## 10480           miracle     surprise
## 10481           miracle        trust
## 10482              fear        anger
## 10483              fear         fear
## 10484              fear     negative
## 10485               sea     positive
## 10486             build     positive
## 10487           prevent         fear
## 10488            damage        anger
## 10489            damage      disgust
## 10490            damage     negative
## 10491            damage      sadness
## 10492              land     positive
## 10493            afford     positive
## 10494          personal        trust
## 10495            change         fear
## 10496          believed        trust
## 10497             money        anger
## 10498             money anticipation
## 10499             money          joy
## 10500             money     positive
## 10501             money     surprise
## 10502             money        trust
## 10503             money        anger
## 10504             money anticipation
## 10505             money          joy
## 10506             money     positive
## 10507             money     surprise
## 10508             money        trust
## 10509              bias        anger
## 10510              bias     negative
## 10511              word     positive
## 10512              word        trust
## 10513              word     positive
## 10514              word        trust
## 10515            denial     negative
## 10516             model     positive
## 10517              time anticipation
## 10518        acceptance     positive
## 10519           rejects        anger
## 10520           rejects         fear
## 10521           rejects     negative
## 10522           rejects      sadness
## 10523          increase     positive
## 10524        convincing        trust
## 10525             adept     positive
## 10526              late     negative
## 10527              late      sadness
## 10528             bound     negative
## 10529            afford     positive
## 10530            afford     positive
## 10531          military         fear
## 10532             sense     positive
## 10533             beach          joy
## 10534            change         fear
## 10535             sense     positive
## 10536              word     positive
## 10537              word        trust
## 10538              word     positive
## 10539              word        trust
## 10540        propaganda     negative
## 10541             wrong     negative
## 10542         concerned         fear
## 10543         concerned      sadness
## 10544            invade        anger
## 10545            invade         fear
## 10546            invade     negative
## 10547            invade      sadness
## 10548            invade     surprise
## 10549             clean          joy
## 10550             clean     positive
## 10551             clean        trust
## 10552             worse         fear
## 10553             worse     negative
## 10554             worse      sadness
## 10555           survive     positive
## 10556              dumb     negative
## 10557             sense     positive
## 10558           selfish        anger
## 10559           selfish      disgust
## 10560           selfish     negative
## 10561            change         fear
## 10562              dumb     negative
## 10563           pollute      disgust
## 10564           pollute     negative
## 10565              dumb     negative
## 10566              dumb     negative
## 10567            unable     negative
## 10568            unable      sadness
## 10569             force        anger
## 10570             force         fear
## 10571             force     negative
## 10572               god anticipation
## 10573               god         fear
## 10574               god          joy
## 10575               god     positive
## 10576               god        trust
## 10577            forbid     negative
## 10578            forbid      sadness
## 10579            proper     positive
## 10580              cold     negative
## 10581               hot        anger
## 10582            desert        anger
## 10583            desert      disgust
## 10584            desert         fear
## 10585            desert     negative
## 10586            desert      sadness
## 10587        technology     positive
## 10588              save          joy
## 10589              save     positive
## 10590              save        trust
## 10591          invasion        anger
## 10592          invasion     negative
## 10593        accomplish          joy
## 10594        accomplish     positive
## 10595              cold     negative
## 10596              save          joy
## 10597              save     positive
## 10598              save        trust
## 10599             crazy        anger
## 10600             crazy         fear
## 10601             crazy     negative
## 10602             crazy      sadness
## 10603          nonsense     negative
## 10604             green          joy
## 10605             green     positive
## 10606             green        trust
## 10607          military         fear
## 10608           drought     negative
## 10609             flood         fear
## 10610            august     positive
## 10611             flood         fear
## 10612             worse         fear
## 10613             worse     negative
## 10614             worse      sadness
## 10615             flood         fear
## 10616             flood         fear
## 10617              soil      disgust
## 10618              soil     negative
## 10619          randomly     surprise
## 10620              lost     negative
## 10621              lost      sadness
## 10622            happen anticipation
## 10623         including     positive
## 10624            happen anticipation
## 10625          randomly     surprise
## 10626            larger      disgust
## 10627            larger     surprise
## 10628            larger        trust
## 10629              time anticipation
## 10630            change         fear
## 10631             daily anticipation
## 10632               sun anticipation
## 10633               sun          joy
## 10634               sun     positive
## 10635               sun     surprise
## 10636               sun        trust
## 10637              cool     positive
## 10638             blame        anger
## 10639             blame      disgust
## 10640             blame     negative
## 10641          mountain anticipation
## 10642            change         fear
## 10643              base        trust
## 10644            pretty anticipation
## 10645            pretty          joy
## 10646            pretty     positive
## 10647            pretty        trust
## 10648         scientist anticipation
## 10649         scientist     positive
## 10650         scientist        trust
## 10651              brag     negative
## 10652              brag     negative
## 10653            change         fear
## 10654             solid     positive
## 10655             idiot      disgust
## 10656             idiot     negative
## 10657           cutting        anger
## 10658           cutting      disgust
## 10659           cutting         fear
## 10660           cutting     negative
## 10661           cutting      sadness
## 10662              base        trust
## 10663          mountain anticipation
## 10664          mountain anticipation
## 10665            change         fear
## 10666             solid     positive
## 10667            change         fear
## 10668            school        trust
## 10669             found          joy
## 10670             found     positive
## 10671             found        trust
## 10672            change         fear
## 10673             doubt         fear
## 10674             doubt     negative
## 10675             doubt      sadness
## 10676             doubt        trust
## 10677             agree     positive
## 10678              bank        trust
## 10679             agree     positive
## 10680            change         fear
## 10681             agree     positive
## 10682            change         fear
## 10683            agreed     positive
## 10684            agreed        trust
## 10685            ignore     negative
## 10686        scientific     positive
## 10687        scientific        trust
## 10688            actual     positive
## 10689            actual     positive
## 10690            change         fear
## 10691             child anticipation
## 10692             child          joy
## 10693             child     positive
## 10694             labor anticipation
## 10695             labor          joy
## 10696             labor     positive
## 10697             labor     surprise
## 10698             labor        trust
## 10699               bad        anger
## 10700               bad      disgust
## 10701               bad         fear
## 10702               bad     negative
## 10703               bad      sadness
## 10704          electric          joy
## 10705          electric     positive
## 10706          electric     surprise
## 10707          fighting        anger
## 10708          fighting     negative
## 10709            change         fear
## 10710            flying         fear
## 10711            flying     positive
## 10712            change         fear
## 10713             major     positive
## 10714              fear        anger
## 10715              fear         fear
## 10716              fear     negative
## 10717              cash        anger
## 10718              cash anticipation
## 10719              cash         fear
## 10720              cash          joy
## 10721              cash     positive
## 10722              cash        trust
## 10723            denial     negative
## 10724             death        anger
## 10725             death anticipation
## 10726             death      disgust
## 10727             death         fear
## 10728             death     negative
## 10729             death      sadness
## 10730             death     surprise
## 10731            denial     negative
## 10732            denial     negative
## 10733            change         fear
## 10734              time anticipation
## 10735               top anticipation
## 10736               top     positive
## 10737               top        trust
## 10738             money        anger
## 10739             money anticipation
## 10740             money          joy
## 10741             money     positive
## 10742             money     surprise
## 10743             money        trust
## 10744              real     positive
## 10745              real        trust
## 10746             truth     positive
## 10747             truth        trust
## 10748           liberal     negative
## 10749           liberal     positive
## 10750             fraud        anger
## 10751             fraud     negative
## 10752              rest     positive
## 10753            reason     positive
## 10754            policy        trust
## 10755         influence     negative
## 10756         influence     positive
## 10757             alive anticipation
## 10758             alive          joy
## 10759             alive     positive
## 10760             alive        trust
## 10761             shock        anger
## 10762             shock         fear
## 10763             shock     negative
## 10764             shock     surprise
## 10765             green          joy
## 10766             green     positive
## 10767             green        trust
## 10768            reason     positive
## 10769         unsightly      disgust
## 10770         unsightly     negative
## 10771         effective     positive
## 10772         effective        trust
## 10773         laughable      disgust
## 10774         laughable     negative
## 10775             clean          joy
## 10776             clean     positive
## 10777             clean        trust
## 10778              main     positive
## 10779               bad        anger
## 10780               bad      disgust
## 10781               bad         fear
## 10782               bad     negative
## 10783               bad      sadness
## 10784          congress      disgust
## 10785          congress        trust
## 10786            reason     positive
## 10787            result anticipation
## 10788         sickening        anger
## 10789         sickening      disgust
## 10790         sickening         fear
## 10791         sickening     negative
## 10792         sickening      sadness
## 10793            result anticipation
## 10794        propaganda     negative
## 10795           suicide        anger
## 10796           suicide         fear
## 10797           suicide     negative
## 10798           suicide      sadness
## 10799       fascinating     positive
## 10800             blame        anger
## 10801             blame      disgust
## 10802             blame     negative
## 10803       information     positive
## 10804           illness         fear
## 10805           illness     negative
## 10806           illness      sadness
## 10807         stupidity     negative
## 10808               don     positive
## 10809               don        trust
## 10810         prevalent        trust
## 10811            scream        anger
## 10812            scream      disgust
## 10813            scream         fear
## 10814            scream     negative
## 10815            scream     surprise
## 10816        government         fear
## 10817        government     negative
## 10818         hurricane         fear
## 10819         hurricane     negative
## 10820           tornado         fear
## 10821             money        anger
## 10822             money anticipation
## 10823             money          joy
## 10824             money     positive
## 10825             money     surprise
## 10826             money        trust
## 10827             money        anger
## 10828             money anticipation
## 10829             money          joy
## 10830             money     positive
## 10831             money     surprise
## 10832             money        trust
## 10833             money        anger
## 10834             money anticipation
## 10835             money          joy
## 10836             money     positive
## 10837             money     surprise
## 10838             money        trust
## 10839       statistical        trust
## 10840            change         fear
## 10841          rigorous     negative
## 10842            proper     positive
## 10843              true          joy
## 10844              true     positive
## 10845              true        trust
## 10846            rising anticipation
## 10847            rising          joy
## 10848            rising     positive
## 10849              true          joy
## 10850              true     positive
## 10851              true        trust
## 10852     unprecedented     surprise
## 10853             trend     positive
## 10854             sadly     negative
## 10855             sadly      sadness
## 10856              blue      sadness
## 10857               don     positive
## 10858               don        trust
## 10859             money        anger
## 10860             money anticipation
## 10861             money          joy
## 10862             money     positive
## 10863             money     surprise
## 10864             money        trust
## 10865               god anticipation
## 10866               god         fear
## 10867               god          joy
## 10868               god     positive
## 10869               god        trust
## 10870              fire         fear
## 10871              time anticipation
## 10872            change         fear
## 10873             prove     positive
## 10874           madness        anger
## 10875           madness         fear
## 10876           madness     negative
## 10877        exhaustion anticipation
## 10878        exhaustion     negative
## 10879        exhaustion      sadness
## 10880          constant     positive
## 10881          constant        trust
## 10882               sky     positive
## 10883           falling     negative
## 10884           falling      sadness
## 10885               sky     positive
## 10886           falling     negative
## 10887           falling      sadness
## 10888            change         fear
## 10889          humanity          joy
## 10890          humanity     positive
## 10891          humanity        trust
## 10892               sky     positive
## 10893           falling     negative
## 10894           falling      sadness
## 10895              time anticipation
## 10896          humanity          joy
## 10897          humanity     positive
## 10898          humanity        trust
## 10899             death        anger
## 10900             death anticipation
## 10901             death      disgust
## 10902             death         fear
## 10903             death     negative
## 10904             death      sadness
## 10905             death     surprise
## 10906       destruction        anger
## 10907       destruction     negative
## 10908            happen anticipation
## 10909             wrong     negative
## 10910             waste      disgust
## 10911             waste     negative
## 10912          cleaning     positive
## 10913         efficient anticipation
## 10914         efficient     positive
## 10915         efficient        trust
## 10916            change         fear
## 10917            happen anticipation
## 10918            giving     positive
## 10919          accurate     positive
## 10920          accurate        trust
## 10921            happen anticipation
## 10922              akin        trust
## 10923            doctor     positive
## 10924            doctor        trust
## 10925             alive anticipation
## 10926             alive          joy
## 10927             alive     positive
## 10928             alive        trust
## 10929             wrong     negative
## 10930               die         fear
## 10931               die     negative
## 10932               die      sadness
## 10933             sense     positive
## 10934            change         fear
## 10935         worsening      disgust
## 10936         worsening     negative
## 10937         worsening      sadness
## 10938              time anticipation
## 10939             worse         fear
## 10940             worse     negative
## 10941             worse      sadness
## 10942              king     positive
## 10943            change         fear
## 10944              save          joy
## 10945              save     positive
## 10946              save        trust
## 10947          humanity          joy
## 10948          humanity     positive
## 10949          humanity        trust
## 10950           leaning        trust
## 10951            change         fear
## 10952              real     positive
## 10953              real        trust
## 10954            happen anticipation
## 10955             watch anticipation
## 10956             watch         fear
## 10957           liberal     negative
## 10958           liberal     positive
## 10959               don     positive
## 10960               don        trust
## 10961               hot        anger
## 10962            degree     positive
## 10963            public anticipation
## 10964            public     positive
## 10965          educated     positive
## 10966        illiterate      disgust
## 10967        illiterate     negative
## 10968            change         fear
## 10969       credibility     positive
## 10970       credibility        trust
## 10971              lost     negative
## 10972              lost      sadness
## 10973             worse         fear
## 10974             worse     negative
## 10975             worse      sadness
## 10976           pretend     negative
## 10977              real     positive
## 10978              real        trust
## 10979            idiocy        anger
## 10980            idiocy      disgust
## 10981            idiocy     negative
## 10982            idiocy      sadness
## 10983           engaged anticipation
## 10984           engaged          joy
## 10985           engaged     positive
## 10986           engaged        trust
## 10987        productive     positive
## 10988          ignorant      disgust
## 10989          ignorant     negative
## 10990            change         fear
## 10991          ridicule        anger
## 10992          ridicule      disgust
## 10993          ridicule     negative
## 10994          ridicule      sadness
## 10995            change         fear
## 10996        contribute     positive
## 10997            change         fear
## 10998           limited        anger
## 10999           limited     negative
## 11000           limited      sadness
## 11001               don     positive
## 11002               don        trust
## 11003            render     positive
## 11004        irrelevant     negative
## 11005              fear        anger
## 11006              fear         fear
## 11007              fear     negative
## 11008             greed        anger
## 11009             greed      disgust
## 11010             greed     negative
## 11011         cognitive     positive
## 11012        dissonance        anger
## 11013        dissonance     negative
## 11014      confirmation        trust
## 11015              bias        anger
## 11016              bias     negative
## 11017               die         fear
## 11018               die     negative
## 11019               die      sadness
## 11020            income anticipation
## 11021            income          joy
## 11022            income     negative
## 11023            income     positive
## 11024            income      sadness
## 11025            income        trust
## 11026             silly          joy
## 11027             silly     negative
## 11028               don     positive
## 11029               don        trust
## 11030           enforce        anger
## 11031           enforce         fear
## 11032           enforce     negative
## 11033           enforce     positive
## 11034            actual     positive
## 11035              talk     positive
## 11036            mobile anticipation
## 11037        horrifying      disgust
## 11038        horrifying         fear
## 11039        horrifying     negative
## 11040        horrifying      sadness
## 11041          hopeless         fear
## 11042          hopeless     negative
## 11043          hopeless      sadness
## 11044             fault     negative
## 11045             fault      sadness
## 11046            denial     negative
## 11047            denial     negative
## 11048            afraid         fear
## 11049            afraid     negative
## 11050            change         fear
## 11051            forced         fear
## 11052            forced     negative
## 11053           madness        anger
## 11054           madness         fear
## 11055           madness     negative
## 11056           madness        anger
## 11057           madness         fear
## 11058           madness     negative
## 11059               top anticipation
## 11060               top     positive
## 11061               top        trust
## 11062              hate        anger
## 11063              hate      disgust
## 11064              hate         fear
## 11065              hate     negative
## 11066              hate      sadness
## 11067            change         fear
## 11068          politics        anger
## 11069             tired     negative
## 11070            happen anticipation
## 11071             force        anger
## 11072             force         fear
## 11073             force     negative
## 11074            happen anticipation
## 11075            oppose     negative
## 11076             force        anger
## 11077             force         fear
## 11078             force     negative
## 11079           notable          joy
## 11080           notable     positive
## 11081           notable        trust
## 11082         celebrity        anger
## 11083         celebrity anticipation
## 11084         celebrity      disgust
## 11085         celebrity          joy
## 11086         celebrity     negative
## 11087         celebrity     positive
## 11088         celebrity     surprise
## 11089         celebrity        trust
## 11090            change         fear
## 11091              bang        anger
## 11092              bang      disgust
## 11093              bang         fear
## 11094              bang     negative
## 11095              bang      sadness
## 11096              bang     surprise
## 11097             elite anticipation
## 11098             elite          joy
## 11099             elite     positive
## 11100             elite        trust
## 11101             lower     negative
## 11102             lower      sadness
## 11103        sacrifices      disgust
## 11104        sacrifices         fear
## 11105        sacrifices     negative
## 11106        sacrifices      sadness
## 11107        exuberance          joy
## 11108        exuberance     positive
## 11109              dumb     negative
## 11110        supporting     positive
## 11111        supporting        trust
## 11112             greed        anger
## 11113             greed      disgust
## 11114             greed     negative
## 11115             money        anger
## 11116             money anticipation
## 11117             money          joy
## 11118             money     positive
## 11119             money     surprise
## 11120             money        trust
## 11121              fear        anger
## 11122              fear         fear
## 11123              fear     negative
## 11124              deal anticipation
## 11125              deal          joy
## 11126              deal     positive
## 11127              deal     surprise
## 11128              deal        trust
## 11129          question     positive
## 11130            giving     positive
## 11131            giving     positive
## 11132            change         fear
## 11133           denying anticipation
## 11134           denying     negative
## 11135         convinced        trust
## 11136            change         fear
## 11137              real     positive
## 11138              real        trust
## 11139              fake     negative
## 11140              real     positive
## 11141              real        trust
## 11142               hit        anger
## 11143               hit     negative
## 11144              shit        anger
## 11145              shit      disgust
## 11146              shit     negative
## 11147              hoax        anger
## 11148              hoax      disgust
## 11149              hoax     negative
## 11150              hoax      sadness
## 11151              hoax     surprise
## 11152          electric          joy
## 11153          electric     positive
## 11154          electric     surprise
## 11155              shit        anger
## 11156              shit      disgust
## 11157              shit     negative
## 11158       information     positive
## 11159           exposed     negative
## 11160      overwhelming     positive
## 11161          contempt        anger
## 11162          contempt      disgust
## 11163          contempt         fear
## 11164          contempt     negative
## 11165      intelligence         fear
## 11166      intelligence          joy
## 11167      intelligence     positive
## 11168      intelligence        trust
## 11169           respect anticipation
## 11170           respect          joy
## 11171           respect     positive
## 11172           respect        trust
## 11173        confidence         fear
## 11174        confidence          joy
## 11175        confidence     positive
## 11176        confidence        trust
## 11177           bravado     negative
## 11178             trend     positive
## 11179         convinced        trust
## 11180             trust        trust
## 11181             lying        anger
## 11182             lying      disgust
## 11183             lying     negative
## 11184            skewed        anger
## 11185            skewed anticipation
## 11186            skewed     negative
## 11187       statistical        trust
## 11188             wrong     negative
## 11189            pretty anticipation
## 11190            pretty          joy
## 11191            pretty     positive
## 11192            pretty        trust
## 11193              time anticipation
## 11194            pretty anticipation
## 11195            pretty          joy
## 11196            pretty     positive
## 11197            pretty        trust
## 11198           despise        anger
## 11199           despise      disgust
## 11200           despise     negative
## 11201       intelligent     positive
## 11202       intelligent        trust
## 11203            forced         fear
## 11204            forced     negative
## 11205              deal anticipation
## 11206              deal          joy
## 11207              deal     positive
## 11208              deal     surprise
## 11209              deal        trust
## 11210             trend     positive
## 11211              buck         fear
## 11212              buck     negative
## 11213              buck     positive
## 11214              buck     surprise
## 11215             money        anger
## 11216             money anticipation
## 11217             money          joy
## 11218             money     positive
## 11219             money     surprise
## 11220             money        trust
## 11221             wrong     negative
## 11222            change         fear
## 11223              real     positive
## 11224              real        trust
## 11225           limited        anger
## 11226           limited     negative
## 11227           limited      sadness
## 11228            change         fear
## 11229        surprising     surprise
## 11230        resistance        anger
## 11231        resistance     negative
## 11232               don     positive
## 11233               don        trust
## 11234            defend         fear
## 11235            defend     positive
## 11236            larger      disgust
## 11237            larger     surprise
## 11238            larger        trust
## 11239             major     positive
## 11240         difficult         fear
## 11241             start anticipation
## 11242             words        anger
## 11243             words     negative
## 11244               don     positive
## 11245               don        trust
## 11246           outrage        anger
## 11247           outrage      disgust
## 11248           outrage     negative
## 11249            reason     positive
## 11250               tax     negative
## 11251               tax      sadness
## 11252             money        anger
## 11253             money anticipation
## 11254             money          joy
## 11255             money     positive
## 11256             money     surprise
## 11257             money        trust
## 11258              true          joy
## 11259              true     positive
## 11260              true        trust
## 11261        hypothesis anticipation
## 11262        hypothesis     surprise
## 11263        conjecture anticipation
## 11264          imminent anticipation
## 11265          imminent         fear
## 11266         extensive     positive
## 11267        scientific     positive
## 11268        scientific        trust
## 11269              time anticipation
## 11270         concerned         fear
## 11271         concerned      sadness
## 11272           limited        anger
## 11273           limited     negative
## 11274           limited      sadness
## 11275            series        trust
## 11276              time anticipation
## 11277            series        trust
## 11278              time anticipation
## 11279             calls anticipation
## 11280             calls     negative
## 11281             calls        trust
## 11282          argument        anger
## 11283          argument     negative
## 11284           fallacy     negative
## 11285          argument        anger
## 11286          argument     negative
## 11287              time anticipation
## 11288             cover        trust
## 11289             cover        trust
## 11290             title     positive
## 11291             title        trust
## 11292           survive     positive
## 11293            coming anticipation
## 11294             march     positive
## 11295              mail anticipation
## 11296             cover        trust
## 11297      authenticity     positive
## 11298      authenticity        trust
## 11299             cover        trust
## 11300         confirmed     positive
## 11301         confirmed        trust
## 11302              hoax        anger
## 11303              hoax      disgust
## 11304              hoax     negative
## 11305              hoax      sadness
## 11306              hoax     surprise
## 11307             cover        trust
## 11308             guide     positive
## 11309             guide        trust
## 11310             money        anger
## 11311             money anticipation
## 11312             money          joy
## 11313             money     positive
## 11314             money     surprise
## 11315             money        trust
## 11316           account        trust
## 11317          majority          joy
## 11318          majority     positive
## 11319          majority        trust
## 11320               pay anticipation
## 11321               pay          joy
## 11322               pay     positive
## 11323               pay        trust
## 11324              fair     positive
## 11325             share anticipation
## 11326             share          joy
## 11327             share     positive
## 11328             share        trust
## 11329             money        anger
## 11330             money anticipation
## 11331             money          joy
## 11332             money     positive
## 11333             money     surprise
## 11334             money        trust
## 11335             lying        anger
## 11336             lying      disgust
## 11337             lying     negative
## 11338            change         fear
## 11339         incorrect     negative
## 11340          doomsday        anger
## 11341          doomsday anticipation
## 11342          doomsday      disgust
## 11343          doomsday         fear
## 11344          doomsday     negative
## 11345          doomsday      sadness
## 11346            racket     negative
## 11347            forced         fear
## 11348            forced     negative
## 11349          restrict     negative
## 11350          restrict      sadness
## 11351            change         fear
## 11352        government         fear
## 11353        government     negative
## 11354           liberal     negative
## 11355           liberal     positive
## 11356             start anticipation
## 11357            degree     positive
## 11358             worth     positive
## 11359         pollution      disgust
## 11360         pollution     negative
## 11361               bad        anger
## 11362               bad      disgust
## 11363               bad         fear
## 11364               bad     negative
## 11365               bad      sadness
## 11366           obvious     positive
## 11367           obvious        trust
## 11368             clean          joy
## 11369             clean     positive
## 11370             clean        trust
## 11371             agree     positive
## 11372            denial     negative
## 11373          personal        trust
## 11374             level     positive
## 11375             level        trust
## 11376            virtue     positive
## 11377            virtue        trust
## 11378             calls anticipation
## 11379             calls     negative
## 11380             calls        trust
## 11381            defeat     negative
## 11382       traditional     positive
## 11383          struggle        anger
## 11384          struggle         fear
## 11385          struggle     negative
## 11386          struggle      sadness
## 11387            change         fear
## 11388          presence     positive
## 11389            change         fear
## 11390       statistical        trust
## 11391             model     positive
## 11392        prediction anticipation
## 11393              real     positive
## 11394              real        trust
## 11395            happen anticipation
## 11396           killing        anger
## 11397           killing         fear
## 11398           killing     negative
## 11399           killing      sadness
## 11400              plan anticipation
## 11401          doomsday        anger
## 11402          doomsday anticipation
## 11403          doomsday      disgust
## 11404          doomsday         fear
## 11405          doomsday     negative
## 11406          doomsday      sadness
## 11407              cult         fear
## 11408              cult     negative
## 11409            pretty anticipation
## 11410            pretty          joy
## 11411            pretty     positive
## 11412            pretty        trust
## 11413            change         fear
## 11414            plague      disgust
## 11415            plague         fear
## 11416            plague     negative
## 11417            plague      sadness
## 11418              kill         fear
## 11419              kill     negative
## 11420              kill      sadness
## 11421             crazy        anger
## 11422             crazy         fear
## 11423             crazy     negative
## 11424             crazy      sadness
## 11425             crazy        anger
## 11426             crazy         fear
## 11427             crazy     negative
## 11428             crazy      sadness
## 11429         ignorance     negative
## 11430          absolute     positive
## 11431            apathy     negative
## 11432            apathy      sadness
## 11433            change         fear
## 11434              fall     negative
## 11435              fall      sadness
## 11436            change         fear
## 11437        completely     positive
## 11438               ban     negative
## 11439            actual     positive
## 11440          solution     positive
## 11441            change         fear
## 11442             rapid     surprise
## 11443              late     negative
## 11444              late      sadness
## 11445       devastating        anger
## 11446       devastating      disgust
## 11447       devastating         fear
## 11448       devastating     negative
## 11449       devastating      sadness
## 11450       devastating        trust
## 11451          humanity          joy
## 11452          humanity     positive
## 11453          humanity        trust
## 11454            mother anticipation
## 11455            mother          joy
## 11456            mother     negative
## 11457            mother     positive
## 11458            mother      sadness
## 11459            mother        trust
## 11460       immediately anticipation
## 11461       immediately     negative
## 11462       immediately     positive
## 11463      inconvenient        anger
## 11464      inconvenient      disgust
## 11465      inconvenient     negative
## 11466      inconvenient      sadness
## 11467             truth     positive
## 11468             truth        trust
## 11469       immediately anticipation
## 11470       immediately     negative
## 11471       immediately     positive
## 11472              gore        anger
## 11473              gore      disgust
## 11474              gore         fear
## 11475              gore     negative
## 11476              gore      sadness
## 11477               sea     positive
## 11478            pretty anticipation
## 11479            pretty          joy
## 11480            pretty     positive
## 11481            pretty        trust
## 11482            flying         fear
## 11483            flying     positive
## 11484           denying anticipation
## 11485           denying     negative
## 11486            change         fear
## 11487               don     positive
## 11488               don        trust
## 11489          practice     positive
## 11490             trade        trust
## 11491            denial     negative
## 11492               god anticipation
## 11493               god         fear
## 11494               god          joy
## 11495               god     positive
## 11496               god        trust
## 11497          ordained     positive
## 11498          ordained        trust
## 11499           economy        trust
## 11500               bad        anger
## 11501               bad      disgust
## 11502               bad         fear
## 11503               bad     negative
## 11504               bad      sadness
## 11505              dumb     negative
## 11506         arguments        anger
## 11507           freedom          joy
## 11508           freedom     positive
## 11509           freedom        trust
## 11510            choice     positive
## 11511            coming anticipation
## 11512          ignorant      disgust
## 11513          ignorant     negative
## 11514             lucky          joy
## 11515             lucky     positive
## 11516             lucky     surprise
## 11517               die         fear
## 11518               die     negative
## 11519               die      sadness
## 11520            denied     negative
## 11521            denied      sadness
## 11522            denied     negative
## 11523            denied      sadness
## 11524           vaccine     positive
## 11525           prevent         fear
## 11526              true          joy
## 11527              true     positive
## 11528              true        trust
## 11529            change         fear
## 11530         believing     positive
## 11531         believing        trust
## 11532             money        anger
## 11533             money anticipation
## 11534             money          joy
## 11535             money     positive
## 11536             money     surprise
## 11537             money        trust
## 11538           madness        anger
## 11539           madness         fear
## 11540           madness     negative
## 11541              shit        anger
## 11542              shit      disgust
## 11543              shit     negative
## 11544             crazy        anger
## 11545             crazy         fear
## 11546             crazy     negative
## 11547             crazy      sadness
## 11548             learn     positive
## 11549       information     positive
## 11550              fear        anger
## 11551              fear         fear
## 11552              fear     negative
## 11553         stupidity     negative
## 11554         ignorance     negative
## 11555           selfish        anger
## 11556           selfish      disgust
## 11557           selfish     negative
## 11558             bliss          joy
## 11559             bliss     positive
## 11560              shit        anger
## 11561              shit      disgust
## 11562              shit     negative
## 11563        scientific     positive
## 11564        scientific        trust
## 11565          educated     positive
## 11566        propaganda     negative
## 11567           special          joy
## 11568           special     positive
## 11569              real     positive
## 11570              real        trust
## 11571              cold     negative
## 11572              boil      disgust
## 11573              boil     negative
## 11574             alive anticipation
## 11575             alive          joy
## 11576             alive     positive
## 11577             alive        trust
## 11578               sea     positive
## 11579           extinct     negative
## 11580           extinct      sadness
## 11581              pose     negative
## 11582            threat        anger
## 11583            threat         fear
## 11584            threat     negative
## 11585          humanity          joy
## 11586          humanity     positive
## 11587          humanity        trust
## 11588            threat        anger
## 11589            threat         fear
## 11590            threat     negative
## 11591              love          joy
## 11592              love     positive
## 11593        completely     positive
## 11594             wrong     negative
## 11595              boil      disgust
## 11596              boil     negative
## 11597           explode        anger
## 11598           explode         fear
## 11599           explode     negative
## 11600           explode      sadness
## 11601           explode     surprise
## 11602           cutting        anger
## 11603           cutting      disgust
## 11604           cutting         fear
## 11605           cutting     negative
## 11606           cutting      sadness
## 11607               ass     negative
## 11608               die         fear
## 11609               die     negative
## 11610               die      sadness
## 11611          majority          joy
## 11612          majority     positive
## 11613          majority        trust
## 11614               sea     positive
## 11615             level     positive
## 11616             level        trust
## 11617         hurricane         fear
## 11618         hurricane     negative
## 11619          continue anticipation
## 11620          continue     positive
## 11621          continue        trust
## 11622             guess     surprise
## 11623           missing         fear
## 11624           missing     negative
## 11625           missing      sadness
## 11626            change         fear
## 11627            threat        anger
## 11628            threat         fear
## 11629            threat     negative
## 11630             major     positive
## 11631          personal        trust
## 11632             level     positive
## 11633             level        trust
## 11634             level     positive
## 11635             level        trust
## 11636          personal        trust
## 11637        sacrifices      disgust
## 11638        sacrifices         fear
## 11639        sacrifices     negative
## 11640        sacrifices      sadness
## 11641            pretty anticipation
## 11642            pretty          joy
## 11643            pretty     positive
## 11644            pretty        trust
## 11645             beach          joy
## 11646          electric          joy
## 11647          electric     positive
## 11648          electric     surprise
## 11649             green          joy
## 11650             green     positive
## 11651             green        trust
## 11652              late     negative
## 11653              late      sadness
## 11654             board anticipation
## 11655             wrong     negative
## 11656              fair     positive
## 11657              time anticipation
## 11658        definitive     positive
## 11659        definitive        trust
## 11660             track anticipation
## 11661           special          joy
## 11662           special     positive
## 11663             dumps        anger
## 11664             dumps     negative
## 11665             dumps      sadness
## 11666              dire      disgust
## 11667              dire         fear
## 11668              dire     negative
## 11669              dire      sadness
## 11670              dire     surprise
## 11671             wrong     negative
## 11672            change         fear
## 11673        impossible     negative
## 11674        impossible      sadness
## 11675        technology     positive
## 11676            denial     negative
## 11677             worse         fear
## 11678             worse     negative
## 11679             worse      sadness
## 11680        conspiracy         fear
## 11681              true          joy
## 11682              true     positive
## 11683              true        trust
## 11684          nonsense     negative
## 11685          religion        trust
## 11686            pretty anticipation
## 11687            pretty          joy
## 11688            pretty     positive
## 11689            pretty        trust
## 11690            change         fear
## 11691              real     positive
## 11692              real        trust
## 11693          restrict     negative
## 11694          restrict      sadness
## 11695            manage     positive
## 11696            manage        trust
## 11697            crisis     negative
## 11698            change         fear
## 11699              real     positive
## 11700              real        trust
## 11701            unable     negative
## 11702            unable      sadness
## 11703        comprehend     positive
## 11704              fear        anger
## 11705              fear         fear
## 11706              fear     negative
## 11707          restrict     negative
## 11708          restrict      sadness
## 11709            manage     positive
## 11710            manage        trust
## 11711             argue        anger
## 11712             argue     negative
## 11713            action     positive
## 11714            crisis     negative
## 11715             sense     positive
## 11716            crisis     negative
## 11717            excess     negative
## 11718            damage        anger
## 11719            damage      disgust
## 11720            damage     negative
## 11721            damage      sadness
## 11722           freedom          joy
## 11723           freedom     positive
## 11724           freedom        trust
## 11725           liberty anticipation
## 11726           liberty          joy
## 11727           liberty     positive
## 11728           liberty     surprise
## 11729           liberty        trust
## 11730    constitutional     positive
## 11731    constitutional        trust
## 11732          conflict        anger
## 11733          conflict         fear
## 11734          conflict     negative
## 11735          conflict      sadness
## 11736            crisis     negative
## 11737            change         fear
## 11738           liberty anticipation
## 11739           liberty          joy
## 11740           liberty     positive
## 11741           liberty     surprise
## 11742           liberty        trust
## 11743           liberty anticipation
## 11744           liberty          joy
## 11745           liberty     positive
## 11746           liberty     surprise
## 11747           liberty        trust
## 11748         sovereign        trust
## 11749           liberty anticipation
## 11750           liberty          joy
## 11751           liberty     positive
## 11752           liberty     surprise
## 11753           liberty        trust
## 11754          powerful        anger
## 11755          powerful anticipation
## 11756          powerful      disgust
## 11757          powerful         fear
## 11758          powerful          joy
## 11759          powerful     positive
## 11760          powerful        trust
## 11761            afraid         fear
## 11762            afraid     negative
## 11763              king     positive
## 11764               tax     negative
## 11765               tax      sadness
## 11766            remove        anger
## 11767            remove         fear
## 11768            remove     negative
## 11769            remove      sadness
## 11770         sovereign        trust
## 11771    constitutional     positive
## 11772    constitutional        trust
## 11773    constitutional     positive
## 11774    constitutional        trust
## 11775        legitimacy        trust
## 11776         overpower     negative
## 11777              hate        anger
## 11778              hate      disgust
## 11779              hate         fear
## 11780              hate     negative
## 11781              hate      sadness
## 11782         sovereign        trust
## 11783            coming anticipation
## 11784            senate        trust
## 11785           killing        anger
## 11786           killing         fear
## 11787           killing     negative
## 11788           killing      sadness
## 11789           cutting        anger
## 11790           cutting      disgust
## 11791           cutting         fear
## 11792           cutting     negative
## 11793           cutting      sadness
## 11794              main     positive
## 11795           liberty anticipation
## 11796           liberty          joy
## 11797           liberty     positive
## 11798           liberty     surprise
## 11799           liberty        trust
## 11800           culture     positive
## 11801               die         fear
## 11802               die     negative
## 11803               die      sadness
## 11804           liberty anticipation
## 11805           liberty          joy
## 11806           liberty     positive
## 11807           liberty     surprise
## 11808           liberty        trust
## 11809            submit anticipation
## 11810             sense     positive
## 11811           embrace anticipation
## 11812           embrace          joy
## 11813           embrace     positive
## 11814           embrace     surprise
## 11815           embrace        trust
## 11816            change         fear
## 11817          reversal        anger
## 11818          reversal      disgust
## 11819          reversal     negative
## 11820          reversal     surprise
## 11821           freedom          joy
## 11822           freedom     positive
## 11823           freedom        trust
## 11824       subjugation        anger
## 11825       subjugation      disgust
## 11826       subjugation         fear
## 11827       subjugation     negative
## 11828       subjugation      sadness
## 11829           freedom          joy
## 11830           freedom     positive
## 11831           freedom        trust
## 11832              fear        anger
## 11833              fear         fear
## 11834              fear     negative
## 11835       catastrophe        anger
## 11836       catastrophe      disgust
## 11837       catastrophe         fear
## 11838       catastrophe     negative
## 11839       catastrophe      sadness
## 11840       catastrophe     surprise
## 11841        ultimately anticipation
## 11842        ultimately     positive
## 11843          punished        anger
## 11844          punished anticipation
## 11845          punished      disgust
## 11846          punished         fear
## 11847          punished     negative
## 11848          punished      sadness
## 11849     irresponsible     negative
## 11850             worry anticipation
## 11851             worry         fear
## 11852             worry     negative
## 11853             worry      sadness
## 11854         framework        trust
## 11855               cry     negative
## 11856               cry      sadness
## 11857             daily anticipation
## 11858              deny        anger
## 11859              deny     negative
## 11860            change         fear
## 11861             vague     negative
## 11862              talk     positive
## 11863         decompose      disgust
## 11864        convincing        trust
## 11865             count     positive
## 11866             count        trust
## 11867       experienced     positive
## 11868       experienced        trust
## 11869      unbelievable     negative
## 11870           knowing     positive
## 11871              time anticipation
## 11872      conservation anticipation
## 11873      conservation     positive
## 11874      conservation        trust
## 11875            afford     positive
## 11876           madness        anger
## 11877           madness         fear
## 11878           madness     negative
## 11879         difficult         fear
## 11880         difficult         fear
## 11881             clean          joy
## 11882             clean     positive
## 11883             clean        trust
## 11884          electric          joy
## 11885          electric     positive
## 11886          electric     surprise
## 11887         challenge        anger
## 11888         challenge         fear
## 11889         challenge     negative
## 11890          obstacle        anger
## 11891          obstacle         fear
## 11892          obstacle     negative
## 11893          obstacle      sadness
## 11894           pretend     negative
## 11895            change         fear
## 11896      inconvenient        anger
## 11897      inconvenient      disgust
## 11898      inconvenient     negative
## 11899      inconvenient      sadness
## 11900              deny        anger
## 11901              deny     negative
## 11902            change         fear
## 11903              real     positive
## 11904              real        trust
## 11905             delay        anger
## 11906             delay      disgust
## 11907             delay         fear
## 11908             delay     negative
## 11909             delay      sadness
## 11910            system        trust
## 11911        corruption      disgust
## 11912        corruption     negative
## 11913             abuse        anger
## 11914             abuse      disgust
## 11915             abuse         fear
## 11916             abuse     negative
## 11917             abuse      sadness
## 11918             money        anger
## 11919             money anticipation
## 11920             money          joy
## 11921             money     positive
## 11922             money     surprise
## 11923             money        trust
## 11924              fear        anger
## 11925              fear         fear
## 11926              fear     negative
## 11927              food          joy
## 11928              food     positive
## 11929              food        trust
## 11930            mighty        anger
## 11931            mighty         fear
## 11932            mighty          joy
## 11933            mighty     positive
## 11934            mighty        trust
## 11935            defend         fear
## 11936            defend     positive
## 11937           survive     positive
## 11938              ugly      disgust
## 11939              ugly     negative
## 11940              fear        anger
## 11941              fear         fear
## 11942              fear     negative
## 11943              fear        anger
## 11944              fear         fear
## 11945              fear     negative
## 11946              fear        anger
## 11947              fear         fear
## 11948              fear     negative
## 11949         ignorance     negative
## 11950              vote        anger
## 11951              vote anticipation
## 11952              vote          joy
## 11953              vote     negative
## 11954              vote     positive
## 11955              vote      sadness
## 11956              vote     surprise
## 11957              vote        trust
## 11958              love          joy
## 11959              love     positive
## 11960               pay anticipation
## 11961               pay          joy
## 11962               pay     positive
## 11963               pay        trust
## 11964            deadly        anger
## 11965            deadly      disgust
## 11966            deadly         fear
## 11967            deadly     negative
## 11968            deadly      sadness
## 11969               sin        anger
## 11970               sin      disgust
## 11971               sin         fear
## 11972               sin     negative
## 11973               sin      sadness
## 11974             fight        anger
## 11975             fight         fear
## 11976             fight     negative
## 11977             prove     positive
## 11978             wrong     negative
## 11979             death        anger
## 11980             death anticipation
## 11981             death      disgust
## 11982             death         fear
## 11983             death     negative
## 11984             death      sadness
## 11985             death     surprise
## 11986             dying        anger
## 11987             dying      disgust
## 11988             dying         fear
## 11989             dying     negative
## 11990             dying      sadness
## 11991            refuse     negative
## 11992             agree     positive
## 11993              true          joy
## 11994              true     positive
## 11995              true        trust
## 11996             argue        anger
## 11997             argue     negative
## 11998       unthinkable        anger
## 11999       unthinkable      disgust
## 12000       unthinkable         fear
## 12001       unthinkable     negative
## 12002            decent     positive
## 12003               god anticipation
## 12004               god         fear
## 12005               god          joy
## 12006               god     positive
## 12007               god        trust
## 12008             flood         fear
## 12009          disaster        anger
## 12010          disaster      disgust
## 12011          disaster         fear
## 12012          disaster     negative
## 12013          disaster      sadness
## 12014          disaster     surprise
## 12015             usual     positive
## 12016             usual        trust
## 12017        disbelieve     negative
## 12018            change         fear
## 12019              real     positive
## 12020              real        trust
## 12021               ill        anger
## 12022               ill      disgust
## 12023               ill         fear
## 12024               ill     negative
## 12025               ill      sadness
## 12026        propaganda     negative
## 12027             money        anger
## 12028             money anticipation
## 12029             money          joy
## 12030             money     positive
## 12031             money     surprise
## 12032             money        trust
## 12033          religion        trust
## 12034               god anticipation
## 12035               god         fear
## 12036               god          joy
## 12037               god     positive
## 12038               god        trust
## 12039           protect     positive
## 12040            reason     positive
## 12041              hate        anger
## 12042              hate      disgust
## 12043              hate         fear
## 12044              hate     negative
## 12045              hate      sadness
## 12046              deny        anger
## 12047              deny     negative
## 12048         existence     positive
## 12049             pride          joy
## 12050             pride     positive
## 12051           deserve        anger
## 12052           deserve anticipation
## 12053           deserve     positive
## 12054           deserve        trust
## 12055               top anticipation
## 12056               top     positive
## 12057               top        trust
## 12058               god anticipation
## 12059               god         fear
## 12060               god          joy
## 12061               god     positive
## 12062               god        trust
## 12063          illusion     negative
## 12064          illusion     surprise
## 12065              fall     negative
## 12066              fall      sadness
## 12067       information     positive
## 12068       superiority     positive
## 12069             death        anger
## 12070             death anticipation
## 12071             death      disgust
## 12072             death         fear
## 12073             death     negative
## 12074             death      sadness
## 12075             death     surprise
## 12076               don     positive
## 12077               don        trust
## 12078             pride          joy
## 12079             pride     positive
## 12080             pride          joy
## 12081             pride     positive
## 12082               don     positive
## 12083               don        trust
## 12084             truth     positive
## 12085             truth        trust
## 12086             pride          joy
## 12087             pride     positive
## 12088             pride          joy
## 12089             pride     positive
## 12090               don     positive
## 12091               don        trust
## 12092             pride          joy
## 12093             pride     positive
## 12094             pride          joy
## 12095             pride     positive
## 12096               don     positive
## 12097               don        trust
## 12098            change         fear
## 12099             pride          joy
## 12100             pride     positive
## 12101      overwhelming     positive
## 12102         stupidity     negative
## 12103       destruction        anger
## 12104       destruction     negative
## 12105           ongoing anticipation
## 12106             folly     negative
## 12107             pride          joy
## 12108             pride     positive
## 12109        ridiculous        anger
## 12110        ridiculous      disgust
## 12111        ridiculous     negative
## 12112             money        anger
## 12113             money anticipation
## 12114             money          joy
## 12115             money     positive
## 12116             money     surprise
## 12117             money        trust
## 12118               eat     positive
## 12119            crisis     negative
## 12120              john      disgust
## 12121              john     negative
## 12122      hypocritical      disgust
## 12123      hypocritical     negative
## 12124          diminish     negative
## 12125          diminish      sadness
## 12126            wealth          joy
## 12127            wealth     positive
## 12128            wealth        trust
## 12129        inequality        anger
## 12130        inequality         fear
## 12131        inequality     negative
## 12132        inequality      sadness
## 12133            wealth          joy
## 12134            wealth     positive
## 12135            wealth        trust
## 12136            change         fear
## 12137        inequality        anger
## 12138        inequality         fear
## 12139        inequality     negative
## 12140        inequality      sadness
## 12141            crisis     negative
## 12142               don     positive
## 12143               don        trust
## 12144        contribute     positive
## 12145              deal anticipation
## 12146              deal          joy
## 12147              deal     positive
## 12148              deal     surprise
## 12149              deal        trust
## 12150        contribute     positive
## 12151            change         fear
## 12152             major     positive
## 12153        convenient     positive
## 12154              time anticipation
## 12155            change         fear
## 12156           madness        anger
## 12157           madness         fear
## 12158           madness     negative
## 12159        corruption      disgust
## 12160        corruption     negative
## 12161         attacking        anger
## 12162         attacking      disgust
## 12163         attacking         fear
## 12164         attacking     negative
## 12165         attacking      sadness
## 12166         attacking     surprise
## 12167         convinced        trust
## 12168    indoctrination        anger
## 12169    indoctrination         fear
## 12170    indoctrination     negative
## 12171               don     positive
## 12172               don        trust
## 12173     understanding     positive
## 12174     understanding        trust
## 12175            theory anticipation
## 12176            theory        trust
## 12177        scientific     positive
## 12178        scientific        trust
## 12179            theory anticipation
## 12180            theory        trust
## 12181              plan anticipation
## 12182              dumb     negative
## 12183              cult         fear
## 12184              cult     negative
## 12185              fake     negative
## 12186           blatant        anger
## 12187           blatant      disgust
## 12188           blatant     negative
## 12189           obvious     positive
## 12190           obvious        trust
## 12191             found          joy
## 12192             found     positive
## 12193             found        trust
## 12194     justification     positive
## 12195               law        trust
## 12196           denying anticipation
## 12197           denying     negative
## 12198           blatant        anger
## 12199           blatant      disgust
## 12200           blatant     negative
## 12201        regression     negative
## 12202             dying        anger
## 12203             dying      disgust
## 12204             dying         fear
## 12205             dying     negative
## 12206             dying      sadness
## 12207           remains      disgust
## 12208           remains         fear
## 12209           remains     negative
## 12210           remains     positive
## 12211           remains        trust
## 12212        government         fear
## 12213        government     negative
## 12214        government         fear
## 12215        government     negative
## 12216        government         fear
## 12217        government     negative
## 12218        completely     positive
## 12219        government         fear
## 12220        government     negative
## 12221            cancer        anger
## 12222            cancer      disgust
## 12223            cancer         fear
## 12224            cancer     negative
## 12225            cancer      sadness
## 12226             title     positive
## 12227             title        trust
## 12228        propaganda     negative
## 12229         statement     positive
## 12230         statement        trust
## 12231         president     positive
## 12232         president        trust
## 12233        government         fear
## 12234        government     negative
## 12235              time anticipation
## 12236             worth     positive
## 12237          majority          joy
## 12238          majority     positive
## 12239          majority        trust
## 12240              tale     positive
## 12241              time anticipation
## 12242            public anticipation
## 12243            public     positive
## 12244               law        trust
## 12245               sue        anger
## 12246               sue     negative
## 12247               sue      sadness
## 12248  unconstitutional     negative
## 12249         institute        trust
## 12250           justice     positive
## 12251           justice        trust
## 12252           justice     positive
## 12253           justice        trust
## 12254      organization anticipation
## 12255      organization          joy
## 12256      organization     positive
## 12257      organization     surprise
## 12258      organization        trust
## 12259            degree     positive
## 12260             child anticipation
## 12261             child          joy
## 12262             child     positive
## 12263             storm        anger
## 12264             storm     negative
## 12265              talk     positive
## 12266              time anticipation
## 12267             title     positive
## 12268             title        trust
## 12269             title     positive
## 12270             title        trust
## 12271        propaganda     negative
## 12272         statement     positive
## 12273         statement        trust
## 12274         president     positive
## 12275         president        trust
## 12276              wild     negative
## 12277              wild     surprise
## 12278           content          joy
## 12279           content     positive
## 12280           content        trust
## 12281             words        anger
## 12282             words     negative
## 12283             title     positive
## 12284             title        trust
## 12285         difficult         fear
## 12286             proof        trust
## 12287            change         fear
## 12288             trend     positive
## 12289        privileged          joy
## 12290        privileged     positive
## 12291        privileged        trust
## 12292            change         fear
## 12293              cash        anger
## 12294              cash anticipation
## 12295              cash         fear
## 12296              cash          joy
## 12297              cash     positive
## 12298              cash        trust
## 12299              gore        anger
## 12300              gore      disgust
## 12301              gore         fear
## 12302              gore     negative
## 12303              gore      sadness
## 12304            offset anticipation
## 12305            offset     positive
## 12306             money        anger
## 12307             money anticipation
## 12308             money          joy
## 12309             money     positive
## 12310             money     surprise
## 12311             money        trust
## 12312             vague     negative
## 12313          verified     positive
## 12314          verified        trust
## 12315         wonderful          joy
## 12316         wonderful     positive
## 12317         wonderful     surprise
## 12318         wonderful        trust
## 12319            reason     positive
## 12320             faith anticipation
## 12321             faith          joy
## 12322             faith     positive
## 12323             faith        trust
## 12324          humanity          joy
## 12325          humanity     positive
## 12326          humanity        trust
## 12327            unable     negative
## 12328            unable      sadness
## 12329         community     positive
## 12330          majority          joy
## 12331          majority     positive
## 12332          majority        trust
## 12333           selfish        anger
## 12334           selfish      disgust
## 12335           selfish     negative
## 12336               don     positive
## 12337               don        trust
## 12338             blame        anger
## 12339             blame      disgust
## 12340             blame     negative
## 12341              late     negative
## 12342              late      sadness
## 12343             laser     positive
## 12344             laser        trust
## 12345             happy anticipation
## 12346             happy          joy
## 12347             happy     positive
## 12348             happy        trust
## 12349             opium        anger
## 12350             opium      disgust
## 12351             opium         fear
## 12352             opium     negative
## 12353             opium      sadness
## 12354           selfish        anger
## 12355           selfish      disgust
## 12356           selfish     negative
## 12357             leave     negative
## 12358             leave      sadness
## 12359             leave     surprise
## 12360             lucky          joy
## 12361             lucky     positive
## 12362             lucky     surprise
## 12363          fighting        anger
## 12364          fighting     negative
## 12365             clean          joy
## 12366             clean     positive
## 12367             clean        trust
## 12368          drinking     negative
## 12369              wait anticipation
## 12370              wait     negative
## 12371             clean          joy
## 12372             clean     positive
## 12373             clean        trust
## 12374            scarce         fear
## 12375            scarce     negative
## 12376            scarce      sadness
## 12377            change         fear
## 12378              real     positive
## 12379              real        trust
## 12380              cold     negative
## 12381             weird      disgust
## 12382             weird     negative
## 12383               hot        anger
## 12384             sunny anticipation
## 12385             sunny          joy
## 12386             sunny     positive
## 12387             sunny     surprise
## 12388            change         fear
## 12389            larger      disgust
## 12390            larger     surprise
## 12391            larger        trust
## 12392             sense     positive
## 12393          accurate     positive
## 12394          accurate        trust
## 12395          sentence        anger
## 12396          sentence anticipation
## 12397          sentence      disgust
## 12398          sentence         fear
## 12399          sentence     negative
## 12400          sentence      sadness
## 12401             agree     positive
## 12402          practice     positive
## 12403           begging     negative
## 12404             bleak     negative
## 12405             bleak      sadness
## 12406            friend          joy
## 12407            friend     positive
## 12408            friend        trust
## 12409           primary     positive
## 12410            school        trust
## 12411        counsellor        anger
## 12412        counsellor         fear
## 12413        counsellor     negative
## 12414        counsellor        trust
## 12415        horrifying      disgust
## 12416        horrifying         fear
## 12417        horrifying     negative
## 12418        horrifying      sadness
## 12419               die         fear
## 12420               die     negative
## 12421               die      sadness
## 12422           illegal        anger
## 12423           illegal      disgust
## 12424           illegal         fear
## 12425           illegal     negative
## 12426           illegal      sadness
## 12427             teach          joy
## 12428             teach     positive
## 12429             teach     surprise
## 12430             teach        trust
## 12431              deal anticipation
## 12432              deal          joy
## 12433              deal     positive
## 12434              deal     surprise
## 12435              deal        trust
## 12436            taught        trust
## 12437           related        trust
## 12438         difficult         fear
## 12439            suffer     negative
## 12440           selfish        anger
## 12441           selfish      disgust
## 12442           selfish     negative
## 12443             sense     positive
## 12444            prefer     positive
## 12445            prefer        trust
## 12446         ignorance     negative
## 12447       catastrophe        anger
## 12448       catastrophe      disgust
## 12449       catastrophe         fear
## 12450       catastrophe     negative
## 12451       catastrophe      sadness
## 12452       catastrophe     surprise
## 12453            stupid     negative
## 12454     understanding     positive
## 12455     understanding        trust
## 12456         cognitive     positive
## 12457        dissonance        anger
## 12458        dissonance     negative
## 12459               god anticipation
## 12460               god         fear
## 12461               god          joy
## 12462               god     positive
## 12463               god        trust
## 12464           abandon         fear
## 12465           abandon     negative
## 12466           abandon      sadness
## 12467     grandchildren anticipation
## 12468     grandchildren          joy
## 12469     grandchildren     positive
## 12470     grandchildren        trust
## 12471     grandchildren anticipation
## 12472     grandchildren          joy
## 12473     grandchildren     positive
## 12474     grandchildren        trust
## 12475            father        trust
## 12476            damage        anger
## 12477            damage      disgust
## 12478            damage     negative
## 12479            damage      sadness
## 12480             worse         fear
## 12481             worse     negative
## 12482             worse      sadness
## 12483     grandchildren anticipation
## 12484     grandchildren          joy
## 12485     grandchildren     positive
## 12486     grandchildren        trust
## 12487              talk     positive
## 12488           partner     positive
## 12489             lover anticipation
## 12490             lover          joy
## 12491             lover     positive
## 12492             lover        trust
## 12493     contradiction     negative
## 12494          pressure     negative
## 12495              talk     positive
## 12496             agree     positive
## 12497       selfishness     negative
## 12498         stupidity     negative
## 12499         ignorance     negative
## 12500               rat      disgust
## 12501               rat         fear
## 12502               rat     negative
## 12503              food          joy
## 12504              food     positive
## 12505              food        trust
## 12506              time anticipation
## 12507            change         fear
## 12508            create          joy
## 12509            create     positive
## 12510              hell        anger
## 12511              hell      disgust
## 12512              hell         fear
## 12513              hell     negative
## 12514              hell      sadness
## 12515          pandemic         fear
## 12516          pandemic     negative
## 12517          pandemic      sadness
## 12518              talk     positive
## 12519             major     positive
## 12520              time anticipation
## 12521             child anticipation
## 12522             child          joy
## 12523             child     positive
## 12524             blame        anger
## 12525             blame      disgust
## 12526             blame     negative
## 12527           survive     positive
## 12528           provide     positive
## 12529           provide        trust
## 12530             tough     negative
## 12531             tough      sadness
## 12532           survive     positive
## 12533             agree     positive
## 12534           reading     positive
## 12535               ash     negative
## 12536          suicidal        anger
## 12537          suicidal      disgust
## 12538          suicidal         fear
## 12539          suicidal     negative
## 12540          suicidal      sadness
## 12541            change         fear
## 12542               don     positive
## 12543               don        trust
## 12544        depression     negative
## 12545        depression      sadness
## 12546              real     positive
## 12547              real        trust
## 12548          horrible        anger
## 12549          horrible      disgust
## 12550          horrible         fear
## 12551          horrible     negative
## 12552            change         fear
## 12553              hope anticipation
## 12554              hope          joy
## 12555              hope     positive
## 12556              hope     surprise
## 12557              hope        trust
## 12558          negative     negative
## 12559          negative      sadness
## 12560            chosen     positive
## 12561         ignorance     negative
## 12562              sick      disgust
## 12563              sick     negative
## 12564              sick      sadness
## 12565           hearing         fear
## 12566           hearing     negative
## 12567            excuse     negative
## 12568            mutter        anger
## 12569            mutter     negative
## 12570              rife     negative
## 12571         resources          joy
## 12572         resources     positive
## 12573         resources        trust
## 12574              late     negative
## 12575              late      sadness
## 12576             avoid         fear
## 12577             avoid     negative
## 12578       catastrophe        anger
## 12579       catastrophe      disgust
## 12580       catastrophe         fear
## 12581       catastrophe     negative
## 12582       catastrophe      sadness
## 12583       catastrophe     surprise
## 12584            crisis     negative
## 12585            excuse     negative
## 12586           lurking     negative
## 12587            excuse     negative
## 12588               don     positive
## 12589               don        trust
## 12590              talk     positive
## 12591             guilt      disgust
## 12592             guilt     negative
## 12593             guilt      sadness
## 12594              shit        anger
## 12595              shit      disgust
## 12596              shit     negative
## 12597         pessimist         fear
## 12598         pessimist     negative
## 12599         pessimist      sadness
## 12600               don     positive
## 12601               don        trust
## 12602               don     positive
## 12603               don        trust
## 12604            change         fear
## 12605             guess     surprise
## 12606             crazy        anger
## 12607             crazy         fear
## 12608             crazy     negative
## 12609             crazy      sadness
## 12610            reason     positive
## 12611        depression     negative
## 12612        depression      sadness
## 12613           anxiety        anger
## 12614           anxiety anticipation
## 12615           anxiety         fear
## 12616           anxiety     negative
## 12617           anxiety      sadness
## 12618            reason     positive
## 12619               bad        anger
## 12620               bad      disgust
## 12621               bad         fear
## 12622               bad     negative
## 12623               bad      sadness
## 12624            change         fear
## 12625            chance     surprise
## 12626              hell        anger
## 12627              hell      disgust
## 12628              hell         fear
## 12629              hell     negative
## 12630              hell      sadness
## 12631             worse         fear
## 12632             worse     negative
## 12633             worse      sadness
## 12634              hell        anger
## 12635              hell      disgust
## 12636              hell         fear
## 12637              hell     negative
## 12638              hell      sadness
## 12639           primary     positive
## 12640            reason     positive
## 12641              talk     positive
## 12642          majority          joy
## 12643          majority     positive
## 12644          majority        trust
## 12645             child anticipation
## 12646             child          joy
## 12647             child     positive
## 12648         community     positive
## 12649           leisure anticipation
## 12650           leisure          joy
## 12651           leisure     positive
## 12652           leisure     surprise
## 12653           leisure        trust
## 12654           freedom          joy
## 12655           freedom     positive
## 12656           freedom        trust
## 12657            choice     positive
## 12658             wrong     negative
## 12659           knowing     positive
## 12660            gamble     negative
## 12661            chance     surprise
## 12662               bad        anger
## 12663               bad      disgust
## 12664               bad         fear
## 12665               bad     negative
## 12666               bad      sadness
## 12667            expose anticipation
## 12668            expose         fear
## 12669             trust        trust
## 12670              clue anticipation
## 12671         recession        anger
## 12672         recession      disgust
## 12673         recession         fear
## 12674         recession     negative
## 12675         recession      sadness
## 12676           brother     positive
## 12677           brother        trust
## 12678           knowing     positive
## 12679      unacceptable     negative
## 12680      unacceptable      sadness
## 12681             child anticipation
## 12682             child          joy
## 12683             child     positive
## 12684          unstable         fear
## 12685          unstable     negative
## 12686          unstable     surprise
## 12687          building     positive
## 12688           perfect anticipation
## 12689           perfect          joy
## 12690           perfect     positive
## 12691           perfect        trust
## 12692          solution     positive
## 12693             agree     positive
## 12694          shortage        anger
## 12695          shortage         fear
## 12696          shortage     negative
## 12697          shortage      sadness
## 12698          drinking     negative
## 12699             quote anticipation
## 12700             quote     negative
## 12701             quote     positive
## 12702             quote     surprise
## 12703            demand        anger
## 12704            demand     negative
## 12705            supply     positive
## 12706        ridiculous        anger
## 12707        ridiculous      disgust
## 12708        ridiculous     negative
## 12709            bloody        anger
## 12710            bloody      disgust
## 12711            bloody         fear
## 12712            bloody     negative
## 12713            bloody      sadness
## 12714            scream        anger
## 12715            scream      disgust
## 12716            scream         fear
## 12717            scream     negative
## 12718            scream     surprise
## 12719          ignorant      disgust
## 12720          ignorant     negative
## 12721             sadly     negative
## 12722             sadly      sadness
## 12723             worry anticipation
## 12724             worry         fear
## 12725             worry     negative
## 12726             worry      sadness
## 12727          critique     positive
## 12728             awful        anger
## 12729             awful      disgust
## 12730             awful         fear
## 12731             awful     negative
## 12732             awful      sadness
## 12733              arid     negative
## 12734              arid      sadness
## 12735         depressed        anger
## 12736         depressed         fear
## 12737         depressed     negative
## 12738         depressed      sadness
## 12739               die         fear
## 12740               die     negative
## 12741               die      sadness
## 12742          withered      disgust
## 12743          withered     negative
## 12744             burnt      disgust
## 12745             burnt     negative
## 12746           starved     negative
## 12747          helpless         fear
## 12748          helpless     negative
## 12749          helpless      sadness
## 12750         convinced        trust
## 12751            united     positive
## 12752            united        trust
## 12753      considerable     positive
## 12754           selfish        anger
## 12755           selfish      disgust
## 12756           selfish     negative
## 12757             moron     negative
## 12758              time anticipation
## 12759         existence     positive
## 12760             child anticipation
## 12761             child          joy
## 12762             child     positive
## 12763              fear        anger
## 12764              fear         fear
## 12765              fear     negative
## 12766           anxiety        anger
## 12767           anxiety anticipation
## 12768           anxiety         fear
## 12769           anxiety     negative
## 12770           anxiety      sadness
## 12771           violent        anger
## 12772           violent      disgust
## 12773           violent         fear
## 12774           violent     negative
## 12775           violent     surprise
## 12776          collapse      disgust
## 12777          collapse         fear
## 12778          collapse     negative
## 12779          collapse      sadness
## 12780              time anticipation
## 12781             child anticipation
## 12782             child          joy
## 12783             child     positive
## 12784              lack     negative
## 12785         foresight anticipation
## 12786         foresight     positive
## 12787         foresight        trust
## 12788             child anticipation
## 12789             child          joy
## 12790             child     positive
## 12791             child anticipation
## 12792             child          joy
## 12793             child     positive
## 12794             abuse        anger
## 12795             abuse      disgust
## 12796             abuse         fear
## 12797             abuse     negative
## 12798             abuse      sadness
## 12799           deserve        anger
## 12800           deserve anticipation
## 12801           deserve     positive
## 12802           deserve        trust
## 12803            school        trust
## 12804            school        trust
## 12805       intelligent     positive
## 12806       intelligent        trust
## 12807             shame      disgust
## 12808             shame         fear
## 12809             shame     negative
## 12810             shame      sadness
## 12811              shit        anger
## 12812              shit      disgust
## 12813              shit     negative
## 12814              dumb     negative
## 12815           selfish        anger
## 12816           selfish      disgust
## 12817           selfish     negative
## 12818            stupid     negative
## 12819              holy     positive
## 12820              shit        anger
## 12821              shit      disgust
## 12822              shit     negative
## 12823           feeling        anger
## 12824           feeling anticipation
## 12825           feeling      disgust
## 12826           feeling         fear
## 12827           feeling          joy
## 12828           feeling     negative
## 12829           feeling     positive
## 12830           feeling      sadness
## 12831           feeling     surprise
## 12832           feeling        trust
## 12833        depressing      disgust
## 12834        depressing     negative
## 12835        depressing      sadness
## 12836          negative     negative
## 12837          negative      sadness
## 12838           ashamed      disgust
## 12839           ashamed     negative
## 12840           ashamed      sadness
## 12841              baby          joy
## 12842              baby     positive
## 12843               don     positive
## 12844               don        trust
## 12845           courage     positive
## 12846            public anticipation
## 12847            public     positive
## 12848            school        trust
## 12849            genius     positive
## 12850             wrong     negative
## 12851          absolute     positive
## 12852             dread anticipation
## 12853             dread         fear
## 12854             dread     negative
## 12855             agree     positive
## 12856         ownership     positive
## 12857        attainable anticipation
## 12858        attainable     positive
## 12859            threat        anger
## 12860            threat         fear
## 12861            threat     negative
## 12862             crazy        anger
## 12863             crazy         fear
## 12864             crazy     negative
## 12865             crazy      sadness
## 12866            change         fear
## 12867              time anticipation
## 12868            happen anticipation
## 12869            suffer     negative
## 12870            coming anticipation
## 12871          starving     negative
## 12872             dying        anger
## 12873             dying      disgust
## 12874             dying         fear
## 12875             dying     negative
## 12876             dying      sadness
## 12877              time anticipation
## 12878             awful        anger
## 12879             awful      disgust
## 12880             awful         fear
## 12881             awful     negative
## 12882             awful      sadness
## 12883        starvation         fear
## 12884        starvation     negative
## 12885        starvation      sadness
## 12886             death        anger
## 12887             death anticipation
## 12888             death      disgust
## 12889             death         fear
## 12890             death     negative
## 12891             death      sadness
## 12892             death     surprise
## 12893        widespread     positive
## 12894           militia        anger
## 12895           militia         fear
## 12896           militia     negative
## 12897           militia      sadness
## 12898            famine     negative
## 12899            famine      sadness
## 12900           drought     negative
## 12901               war         fear
## 12902               war     negative
## 12903              land     positive
## 12904           survive     positive
## 12905             guess     surprise
## 12906            luxury          joy
## 12907            luxury     positive
## 12908       opportunity anticipation
## 12909       opportunity     positive
## 12910           provide     positive
## 12911           provide        trust
## 12912     unsustainable     negative
## 12913             guess     surprise
## 12914            change         fear
## 12915          majority          joy
## 12916          majority     positive
## 12917          majority        trust
## 12918            result anticipation
## 12919             guess     surprise
## 12920             agree     positive
## 12921              baby          joy
## 12922              baby     positive
## 12923              baby          joy
## 12924              baby     positive
## 12925            solace     positive
## 12926          continue anticipation
## 12927          continue     positive
## 12928          continue        trust
## 12929          humanity          joy
## 12930          humanity     positive
## 12931          humanity        trust
## 12932            pretty anticipation
## 12933            pretty          joy
## 12934            pretty     positive
## 12935            pretty        trust
## 12936              cool     positive
## 12937           selfish        anger
## 12938           selfish      disgust
## 12939           selfish     negative
## 12940            crisis     negative
## 12941            effort     positive
## 12942        impossible     negative
## 12943        impossible      sadness
## 12944            tackle        anger
## 12945            tackle     surprise
## 12946             level     positive
## 12947             level        trust
## 12948            ignore     negative
## 12949       selfishness     negative
## 12950               die         fear
## 12951               die     negative
## 12952               die      sadness
## 12953             leave     negative
## 12954             leave      sadness
## 12955             leave     surprise
## 12956             worse         fear
## 12957             worse     negative
## 12958             worse      sadness
## 12959               pay anticipation
## 12960               pay          joy
## 12961               pay     positive
## 12962               pay        trust
## 12963             crazy        anger
## 12964             crazy         fear
## 12965             crazy     negative
## 12966             crazy      sadness
## 12967          disagree        anger
## 12968          disagree     negative
## 12969             crazy        anger
## 12970             crazy         fear
## 12971             crazy     negative
## 12972             crazy      sadness
## 12973            change         fear
## 12974              time anticipation
## 12975               bad        anger
## 12976               bad      disgust
## 12977               bad         fear
## 12978               bad     negative
## 12979               bad      sadness
## 12980             wages          joy
## 12981             wages     positive
## 12982          struggle        anger
## 12983          struggle         fear
## 12984          struggle     negative
## 12985          struggle      sadness
## 12986             broke         fear
## 12987             broke     negative
## 12988             broke      sadness
## 12989        delusional        anger
## 12990        delusional         fear
## 12991        delusional     negative
## 12992              love          joy
## 12993              love     positive
## 12994            school        trust
## 12995         nightmare         fear
## 12996         nightmare     negative
## 12997           primary     positive
## 12998         arguments        anger
## 12999             child anticipation
## 13000             child          joy
## 13001             child     positive
## 13002        capitalist     positive
## 13003              pawn     negative
## 13004              pawn        trust
## 13005             money        anger
## 13006             money anticipation
## 13007             money          joy
## 13008             money     positive
## 13009             money     surprise
## 13010             money        trust
## 13011             child anticipation
## 13012             child          joy
## 13013             child     positive
## 13014          criminal        anger
## 13015          criminal      disgust
## 13016          criminal         fear
## 13017          criminal     negative
## 13018      advantageous     positive
## 13019          convince anticipation
## 13020          convince     positive
## 13021          convince        trust
## 13022             money        anger
## 13023             money anticipation
## 13024             money          joy
## 13025             money     positive
## 13026             money     surprise
## 13027             money        trust
## 13028             haven     positive
## 13029             haven        trust
## 13030           courage     positive
## 13031            reason     positive
## 13032           account        trust
## 13033             share anticipation
## 13034             share          joy
## 13035             share     positive
## 13036             share        trust
## 13037       progressive     positive
## 13038           obvious     positive
## 13039           obvious        trust
## 13040             level     positive
## 13041             level        trust
## 13042           cruelty        anger
## 13043           cruelty      disgust
## 13044           cruelty         fear
## 13045           cruelty     negative
## 13046           cruelty      sadness
## 13047            rising anticipation
## 13048            rising          joy
## 13049            rising     positive
## 13050         miserable        anger
## 13051         miserable      disgust
## 13052         miserable     negative
## 13053         miserable      sadness
## 13054          horrible        anger
## 13055          horrible      disgust
## 13056          horrible         fear
## 13057          horrible     negative
## 13058           perfect anticipation
## 13059           perfect          joy
## 13060           perfect     positive
## 13061           perfect        trust
## 13062             sense     positive
## 13063             child anticipation
## 13064             child          joy
## 13065             child     positive
## 13066              fear        anger
## 13067              fear         fear
## 13068              fear     negative
## 13069             cruel        anger
## 13070             cruel      disgust
## 13071             cruel         fear
## 13072             cruel     negative
## 13073             cruel      sadness
## 13074        dissonance        anger
## 13075        dissonance     negative
## 13076       unfulfilled        anger
## 13077       unfulfilled anticipation
## 13078       unfulfilled     negative
## 13079       unfulfilled      sadness
## 13080       unfulfilled     surprise
## 13081            unkind        anger
## 13082            unkind      disgust
## 13083            unkind         fear
## 13084            unkind     negative
## 13085            unkind      sadness
## 13086              spat        anger
## 13087              spat     negative
## 13088     understanding     positive
## 13089     understanding        trust
## 13090            lonely        anger
## 13091            lonely      disgust
## 13092            lonely         fear
## 13093            lonely     negative
## 13094            lonely      sadness
## 13095             crazy        anger
## 13096             crazy         fear
## 13097             crazy     negative
## 13098             crazy      sadness
## 13099             crazy        anger
## 13100             crazy         fear
## 13101             crazy     negative
## 13102             crazy      sadness
## 13103              late     negative
## 13104              late      sadness
## 13105        population     positive
## 13106            growth     positive
## 13107           helpful          joy
## 13108           helpful     positive
## 13109           helpful        trust
## 13110           machine        trust
## 13111            hungry anticipation
## 13112            hungry     negative
## 13113           measure        trust
## 13114          progress anticipation
## 13115          progress          joy
## 13116          progress     positive
## 13117            growth     positive
## 13118            growth     positive
## 13119         efficient anticipation
## 13120         efficient     positive
## 13121         efficient        trust
## 13122         resources          joy
## 13123         resources     positive
## 13124         resources        trust
## 13125             waste      disgust
## 13126             waste     negative
## 13127            change         fear
## 13128            heresy     negative
## 13129          advocate        trust
## 13130           economy        trust
## 13131       detrimental     negative
## 13132            wealth          joy
## 13133            wealth     positive
## 13134            wealth        trust
## 13135            denial     negative
## 13136          infinite     positive
## 13137            growth     positive
## 13138        impossible     negative
## 13139        impossible      sadness
## 13140           machine        trust
## 13141              food          joy
## 13142              food     positive
## 13143              food        trust
## 13144           willful        anger
## 13145           willful     negative
## 13146           willful      sadness
## 13147            denial     negative
## 13148      entertaining anticipation
## 13149      entertaining          joy
## 13150      entertaining     positive
## 13151              hope anticipation
## 13152              hope          joy
## 13153              hope     positive
## 13154              hope     surprise
## 13155              hope        trust
## 13156              shit        anger
## 13157              shit      disgust
## 13158              shit     negative
## 13159               bad        anger
## 13160               bad      disgust
## 13161               bad         fear
## 13162               bad     negative
## 13163               bad      sadness
## 13164           special          joy
## 13165           special     positive
## 13166          superior     positive
## 13167            guilty        anger
## 13168            guilty     negative
## 13169            guilty      sadness
## 13170           inflict        anger
## 13171           inflict         fear
## 13172           inflict     negative
## 13173           inflict      sadness
## 13174              food          joy
## 13175              food     positive
## 13176              food        trust
## 13177        population     positive
## 13178           disease        anger
## 13179           disease      disgust
## 13180           disease         fear
## 13181           disease     negative
## 13182           disease      sadness
## 13183            famine     negative
## 13184            famine      sadness
## 13185          superior     positive
## 13186            doomed         fear
## 13187            doomed     negative
## 13188            doomed      sadness
## 13189              fate anticipation
## 13190              fate     negative
## 13191           extinct     negative
## 13192           extinct      sadness
## 13193           decline     negative
## 13194            pretty anticipation
## 13195            pretty          joy
## 13196            pretty     positive
## 13197            pretty        trust
## 13198          suddenly     surprise
## 13199         adaptable     positive
## 13200              time anticipation
## 13201           develop anticipation
## 13202           develop     positive
## 13203           ability     positive
## 13204           survive     positive
## 13205              time anticipation
## 13206         resistant         fear
## 13207         resistant     negative
## 13208            deadly        anger
## 13209            deadly      disgust
## 13210            deadly         fear
## 13211            deadly     negative
## 13212            deadly      sadness
## 13213        infectious      disgust
## 13214        infectious         fear
## 13215        infectious     negative
## 13216        infectious      sadness
## 13217         radiation         fear
## 13218         radiation     negative
## 13219             start anticipation
## 13220         producing     positive
## 13221             break     surprise
## 13222           fragile         fear
## 13223           fragile     negative
## 13224           fragile      sadness
## 13225         celebrity        anger
## 13226         celebrity anticipation
## 13227         celebrity      disgust
## 13228         celebrity          joy
## 13229         celebrity     negative
## 13230         celebrity     positive
## 13231         celebrity     surprise
## 13232         celebrity        trust
## 13233            gossip     negative
## 13234               don     positive
## 13235               don        trust
## 13236            script     positive
## 13237           selfish        anger
## 13238           selfish      disgust
## 13239           selfish     negative
## 13240          complain        anger
## 13241          complain     negative
## 13242          complain      sadness
## 13243            afraid         fear
## 13244            afraid     negative
## 13245             child anticipation
## 13246             child          joy
## 13247             child     positive
## 13248         suffering      disgust
## 13249         suffering         fear
## 13250         suffering     negative
## 13251         suffering      sadness
## 13252          struggle        anger
## 13253          struggle         fear
## 13254          struggle     negative
## 13255          struggle      sadness
## 13256              love          joy
## 13257              love     positive
## 13258         difficult         fear
## 13259             child anticipation
## 13260             child          joy
## 13261             child     positive
## 13262          vigilant         fear
## 13263          vigilant     positive
## 13264          vigilant        trust
## 13265        supporting     positive
## 13266        supporting        trust
## 13267         cognitive     positive
## 13268        dissonance        anger
## 13269        dissonance     negative
## 13270              wild     negative
## 13271              wild     surprise
## 13272           intense        anger
## 13273           intense      disgust
## 13274           intense         fear
## 13275           intense          joy
## 13276           intense     negative
## 13277           intense     positive
## 13278           intense     surprise
## 13279           intense        trust
## 13280          pressure     negative
## 13281          continue anticipation
## 13282          continue     positive
## 13283          continue        trust
## 13284          question     positive
## 13285              real     positive
## 13286              real        trust
## 13287            status     positive
## 13288              kill         fear
## 13289              kill     negative
## 13290              kill      sadness
## 13291        completely     positive
## 13292         arguments        anger
## 13293           asshole        anger
## 13294           asshole      disgust
## 13295           asshole     negative
## 13296           killing        anger
## 13297           killing         fear
## 13298           killing     negative
## 13299           killing      sadness
## 13300             alive anticipation
## 13301             alive          joy
## 13302             alive     positive
## 13303             alive        trust
## 13304           killing        anger
## 13305           killing         fear
## 13306           killing     negative
## 13307           killing      sadness
## 13308           cherish anticipation
## 13309           cherish          joy
## 13310           cherish     positive
## 13311           cherish     surprise
## 13312           cherish        trust
## 13313         dignified     positive
## 13314               don     positive
## 13315               don        trust
## 13316         existence     positive
## 13317             alien      disgust
## 13318             alien         fear
## 13319             alien     negative
## 13320       advancement     positive
## 13321         existence     positive
## 13322           provide     positive
## 13323           provide        trust
## 13324          humanity          joy
## 13325          humanity     positive
## 13326          humanity        trust
## 13327             argue        anger
## 13328             argue     negative
## 13329               hit        anger
## 13330               hit     negative
## 13331         breakdown     negative
## 13332          humanity          joy
## 13333          humanity     positive
## 13334          humanity        trust
## 13335          humanity          joy
## 13336          humanity     positive
## 13337          humanity        trust
## 13338             start anticipation
## 13339             start anticipation
## 13340           forfeit        anger
## 13341           forfeit     negative
## 13342           forfeit      sadness
## 13343            humble      disgust
## 13344            humble     negative
## 13345            humble     positive
## 13346            humble      sadness
## 13347            expect anticipation
## 13348            expect     positive
## 13349            expect     surprise
## 13350            expect        trust
## 13351             major     positive
## 13352        population     positive
## 13353            supply     positive
## 13354      civilization     positive
## 13355      civilization        trust
## 13356         resources          joy
## 13357         resources     positive
## 13358         resources        trust
## 13359         convinced        trust
## 13360        population     positive
## 13361         supported     positive
## 13362        population     positive
## 13363            happen anticipation
## 13364       catastrophe        anger
## 13365       catastrophe      disgust
## 13366       catastrophe         fear
## 13367       catastrophe     negative
## 13368       catastrophe      sadness
## 13369       catastrophe     surprise
## 13370          advanced     positive
## 13371           economy        trust
## 13372              baby          joy
## 13373              baby     positive
## 13374               don     positive
## 13375               don        trust
## 13376        government         fear
## 13377        government     negative
## 13378           decline     negative
## 13379      civilization     positive
## 13380      civilization        trust
## 13381          increase     positive
## 13382               bad        anger
## 13383               bad      disgust
## 13384               bad         fear
## 13385               bad     negative
## 13386               bad      sadness
## 13387          continue anticipation
## 13388          continue     positive
## 13389          continue        trust
## 13390            wealth          joy
## 13391            wealth     positive
## 13392            wealth        trust
## 13393         existence     positive
## 13394      civilization     positive
## 13395      civilization        trust
## 13396            misuse     negative
## 13397         resources          joy
## 13398         resources     positive
## 13399         resources        trust
## 13400             agree     positive
## 13401            expect anticipation
## 13402            expect     positive
## 13403            expect     surprise
## 13404            expect        trust
## 13405           foresee anticipation
## 13406           foresee     positive
## 13407           foresee     surprise
## 13408           foresee        trust
## 13409             major     positive
## 13410         intuitive     positive
## 13411             sense     positive
## 13412         forgotten         fear
## 13413         forgotten     negative
## 13414         forgotten      sadness
## 13415     consciousness     positive
## 13416             weird      disgust
## 13417             weird     negative
## 13418              time anticipation
## 13419             alive anticipation
## 13420             alive          joy
## 13421             alive     positive
## 13422             alive        trust
## 13423             civil     positive
## 13424               war         fear
## 13425               war     negative
## 13426              time anticipation
## 13427          fighting        anger
## 13428          fighting     negative
## 13429             civil     positive
## 13430               war         fear
## 13431               war     negative
## 13432            create          joy
## 13433            create     positive
## 13434        detonation        anger
## 13435            theory anticipation
## 13436            theory        trust
## 13437       theoretical     positive
## 13438            proven        trust
## 13439             money        anger
## 13440             money anticipation
## 13441             money          joy
## 13442             money     positive
## 13443             money     surprise
## 13444             money        trust
## 13445        government         fear
## 13446        government     negative
## 13447             clock anticipation
## 13448              time anticipation
## 13449            reason     positive
## 13450        unforeseen     surprise
## 13451            coming anticipation
## 13452              clue anticipation
## 13453         committed     positive
## 13454         committed        trust
## 13455          minority     negative
## 13456            coming anticipation
## 13457          minority     negative
## 13458            friend          joy
## 13459            friend     positive
## 13460            friend        trust
## 13461               foe        anger
## 13462               foe         fear
## 13463               foe     negative
## 13464            friend          joy
## 13465            friend     positive
## 13466            friend        trust
## 13467         skeptical     negative
## 13468            uneasy      disgust
## 13469            uneasy         fear
## 13470            uneasy     negative
## 13471        staggering     negative
## 13472          alarming         fear
## 13473          alarming     negative
## 13474          alarming     surprise
## 13475        constantly        trust
## 13476             daily anticipation
## 13477              love          joy
## 13478              love     positive
## 13479              time anticipation
## 13480             craft     positive
## 13481              real     positive
## 13482              real        trust
## 13483      unimaginable     negative
## 13484      unimaginable     positive
## 13485      unimaginable     surprise
## 13486     understanding     positive
## 13487     understanding        trust
## 13488           physics     positive
## 13489              shit        anger
## 13490              shit      disgust
## 13491              shit     negative
## 13492             count     positive
## 13493             count        trust
## 13494              real     positive
## 13495              real        trust
## 13496            happen anticipation
## 13497           explain     positive
## 13498           explain        trust
## 13499            change         fear
## 13500             alien      disgust
## 13501             alien         fear
## 13502             alien     negative
## 13503         evolution     positive
## 13504             chasm         fear
## 13505            threat        anger
## 13506            threat         fear
## 13507            threat     negative
## 13508             petty     negative
## 13509       cooperative     positive
## 13510       cooperative        trust
## 13511             alien      disgust
## 13512             alien         fear
## 13513             alien     negative
## 13514      civilization     positive
## 13515      civilization        trust
## 13516              akin        trust
## 13517        successful anticipation
## 13518        successful          joy
## 13519        successful     positive
## 13520        successful        trust
## 13521         dangerous         fear
## 13522         dangerous     negative
## 13523            public anticipation
## 13524            public     positive
## 13525         brilliant anticipation
## 13526         brilliant          joy
## 13527         brilliant     positive
## 13528         brilliant        trust
## 13529      intelligence         fear
## 13530      intelligence          joy
## 13531      intelligence     positive
## 13532      intelligence        trust
## 13533          immortal     positive
## 13534             drone     negative
## 13535            happen anticipation
## 13536         knowledge     positive
## 13537           durable     positive
## 13538           durable        trust
## 13539       intelligent     positive
## 13540       intelligent        trust
## 13541         confirmed     positive
## 13542         confirmed        trust
## 13543          progress anticipation
## 13544          progress          joy
## 13545          progress     positive
## 13546              spur         fear
## 13547        technology     positive
## 13548           extinct     negative
## 13549           extinct      sadness
## 13550            chance     surprise
## 13551             money        anger
## 13552             money anticipation
## 13553             money          joy
## 13554             money     positive
## 13555             money     surprise
## 13556             money        trust
## 13557      collectively     positive
## 13558      collectively        trust
## 13559       responsible     positive
## 13560       responsible        trust
## 13561         improving     positive
## 13562         improving     positive
## 13563        impassable     negative
## 13564          familiar     positive
## 13565          familiar        trust
## 13566       intelligent     positive
## 13567       intelligent        trust
## 13568       fascinating     positive
## 13569              true          joy
## 13570              true     positive
## 13571              true        trust
## 13572        impossible     negative
## 13573        impossible      sadness
## 13574              real     positive
## 13575              real        trust
## 13576        impossible     negative
## 13577        impossible      sadness
## 13578           shortly anticipation
## 13579       advancement     positive
## 13580         including     positive
## 13581        difficulty        anger
## 13582        difficulty         fear
## 13583        difficulty     negative
## 13584        difficulty      sadness
## 13585             giant         fear
## 13586               hit        anger
## 13587               hit     negative
## 13588      civilization     positive
## 13589      civilization        trust
## 13590            plague      disgust
## 13591            plague         fear
## 13592            plague     negative
## 13593            plague      sadness
## 13594        difficulty        anger
## 13595        difficulty         fear
## 13596        difficulty     negative
## 13597        difficulty      sadness
## 13598       intelligent     positive
## 13599       intelligent        trust
## 13600          advanced     positive
## 13601         including     positive
## 13602      civilization     positive
## 13603      civilization        trust
## 13604              hope anticipation
## 13605              hope          joy
## 13606              hope     positive
## 13607              hope     surprise
## 13608              hope        trust
## 13609       coincidence     surprise
## 13610              time anticipation
## 13611         precipice         fear
## 13612             trump     surprise
## 13613             giant         fear
## 13614          question     positive
## 13615        accessible     positive
## 13616       intelligent     positive
## 13617       intelligent        trust
## 13618       intelligent     positive
## 13619       intelligent        trust
## 13620              dark      sadness
## 13621        hypothesis anticipation
## 13622        hypothesis     surprise
## 13623            unique     positive
## 13624            unique     surprise
## 13625             extra     positive
## 13626           contact     positive
## 13627              lost     negative
## 13628              lost      sadness
## 13629          disagree        anger
## 13630          disagree     negative
## 13631            pretty anticipation
## 13632            pretty          joy
## 13633            pretty     positive
## 13634            pretty        trust
## 13635             gross      disgust
## 13636             gross     negative
## 13637             argue        anger
## 13638             argue     negative
## 13639              lack     negative
## 13640       intelligent     positive
## 13641       intelligent        trust
## 13642           absence         fear
## 13643           absence     negative
## 13644           absence      sadness
## 13645             wrong     negative
## 13646              lack     negative
## 13647         existence     positive
## 13648      intelligence         fear
## 13649      intelligence          joy
## 13650      intelligence     positive
## 13651      intelligence        trust
## 13652            result anticipation
## 13653        definitive     positive
## 13654        definitive        trust
## 13655           absence         fear
## 13656           absence     negative
## 13657           absence      sadness
## 13658             argue        anger
## 13659             argue     negative
## 13660          majority          joy
## 13661          majority     positive
## 13662          majority        trust
## 13663          majority          joy
## 13664          majority     positive
## 13665          majority        trust
## 13666               don     positive
## 13667               don        trust
## 13668       complicated     negative
## 13669          question     positive
## 13670            honest        anger
## 13671            honest      disgust
## 13672            honest         fear
## 13673            honest          joy
## 13674            honest     positive
## 13675            honest      sadness
## 13676            honest        trust
## 13677           physics     positive
## 13678              dark      sadness
## 13679           physics     positive
## 13680          infinite     positive
## 13681           regress     negative
## 13682              word     positive
## 13683              word        trust
## 13684         asserting     positive
## 13685         asserting        trust
## 13686               law        trust
## 13687               don     positive
## 13688               don        trust
## 13689           lunatic        anger
## 13690           lunatic      disgust
## 13691           lunatic         fear
## 13692           lunatic     negative
## 13693          infinite     positive
## 13694              dark      sadness
## 13695     understanding     positive
## 13696     understanding        trust
## 13697           explain     positive
## 13698           explain        trust
## 13699         existence     positive
## 13700             error     negative
## 13701             error      sadness
## 13702            theory anticipation
## 13703            theory        trust
## 13704             haven     positive
## 13705             haven        trust
## 13706              fair     positive
## 13707            expect anticipation
## 13708            expect     positive
## 13709            expect     surprise
## 13710            expect        trust
## 13711       intelligent     positive
## 13712       intelligent        trust
## 13713              bear        anger
## 13714              bear         fear
## 13715             merit     positive
## 13716             merit        trust
## 13717             inter     negative
## 13718             inter      sadness
## 13719        hypothesis anticipation
## 13720        hypothesis     surprise
## 13721             worth     positive
## 13722         uniformly     positive
## 13723         psychosis        anger
## 13724         psychosis         fear
## 13725         psychosis     negative
## 13726         psychosis      sadness
## 13727              real     positive
## 13728              real        trust
## 13729         existence     positive
## 13730           explain     positive
## 13731           explain        trust
## 13732           primary     positive
## 13733              star anticipation
## 13734              star          joy
## 13735              star     positive
## 13736              star        trust
## 13737             sense     positive
## 13738          barbaric        anger
## 13739          barbaric      disgust
## 13740          barbaric         fear
## 13741          barbaric     negative
## 13742         existence     positive
## 13743           provide     positive
## 13744           provide        trust
## 13745          humanity          joy
## 13746          humanity     positive
## 13747          humanity        trust
## 13748        population     positive
## 13749            bummer        anger
## 13750            bummer      disgust
## 13751            bummer     negative
## 13752           account        trust
## 13753     understanding     positive
## 13754     understanding        trust
## 13755         knowledge     positive
## 13756      intelligence         fear
## 13757      intelligence          joy
## 13758      intelligence     positive
## 13759      intelligence        trust
## 13760      civilization     positive
## 13761      civilization        trust
## 13762              time anticipation
## 13763          received     positive
## 13764           delayed     negative
## 13765              time anticipation
## 13766           account        trust
## 13767      intelligence         fear
## 13768      intelligence          joy
## 13769      intelligence     positive
## 13770      intelligence        trust
## 13771              time anticipation
## 13772            proven        trust
## 13773       credibility     positive
## 13774       credibility        trust
## 13775            blower     negative
## 13776           foolish     negative
## 13777              shot        anger
## 13778              shot         fear
## 13779              shot     negative
## 13780              shot      sadness
## 13781              shot     surprise
## 13782              dark      sadness
## 13783            weight anticipation
## 13784            weight      disgust
## 13785            weight         fear
## 13786            weight          joy
## 13787            weight     negative
## 13788            weight     positive
## 13789            weight      sadness
## 13790            weight     surprise
## 13791            weight        trust
## 13792      civilization     positive
## 13793      civilization        trust
## 13794              time anticipation
## 13795              time anticipation
## 13796               war         fear
## 13797               war     negative
## 13798          horrible        anger
## 13799          horrible      disgust
## 13800          horrible         fear
## 13801          horrible     negative
## 13802      intelligence         fear
## 13803      intelligence          joy
## 13804      intelligence     positive
## 13805      intelligence        trust
## 13806              lost     negative
## 13807              lost      sadness
## 13808             glory anticipation
## 13809             glory          joy
## 13810             glory     positive
## 13811             glory        trust
## 13812            resist     negative
## 13813       possibility anticipation
## 13814               don     positive
## 13815               don        trust
## 13816              hope anticipation
## 13817              hope          joy
## 13818              hope     positive
## 13819              hope     surprise
## 13820              hope        trust
## 13821             truth     positive
## 13822             truth        trust
## 13823          humanity          joy
## 13824          humanity     positive
## 13825          humanity        trust
## 13826              evil        anger
## 13827              evil      disgust
## 13828              evil         fear
## 13829              evil     negative
## 13830              evil      sadness
## 13831            manage     positive
## 13832            manage        trust
## 13833             trust        trust
## 13834            crisis     negative
## 13835          exciting anticipation
## 13836          exciting          joy
## 13837          exciting     positive
## 13838          exciting     surprise
## 13839               job     positive
## 13840            afford     positive
## 13841               fun anticipation
## 13842               fun          joy
## 13843               fun     positive
## 13844            decent     positive
## 13845               job     positive
## 13846            afford     positive
## 13847          disagree        anger
## 13848          disagree     negative
## 13849            system        trust
## 13850            create          joy
## 13851            create     positive
## 13852             learn     positive
## 13853            accord     positive
## 13854            accord        trust
## 13855        government         fear
## 13856        government     negative
## 13857         confirmed     positive
## 13858         confirmed        trust
## 13859      intelligence         fear
## 13860      intelligence          joy
## 13861      intelligence     positive
## 13862      intelligence        trust
## 13863         concerned         fear
## 13864         concerned      sadness
## 13865               pay anticipation
## 13866               pay          joy
## 13867               pay     positive
## 13868               pay        trust
## 13869           survive     positive
## 13870             sense     positive
## 13871              hell        anger
## 13872              hell      disgust
## 13873              hell         fear
## 13874              hell     negative
## 13875              hell      sadness
## 13876              hell        anger
## 13877              hell      disgust
## 13878              hell         fear
## 13879              hell     negative
## 13880              hell      sadness
## 13881             agree     positive
## 13882             worse         fear
## 13883             worse     negative
## 13884             worse      sadness
## 13885          disagree        anger
## 13886          disagree     negative
## 13887             worse         fear
## 13888             worse     negative
## 13889             worse      sadness
## 13890             alive anticipation
## 13891             alive          joy
## 13892             alive     positive
## 13893             alive        trust
## 13894            plague      disgust
## 13895            plague         fear
## 13896            plague     negative
## 13897            plague      sadness
## 13898        depression     negative
## 13899        depression      sadness
## 13900              fall     negative
## 13901              fall      sadness
## 13902               war         fear
## 13903               war     negative
## 13904               bad        anger
## 13905               bad      disgust
## 13906               bad         fear
## 13907               bad     negative
## 13908               bad      sadness
## 13909              time anticipation
## 13910             alive anticipation
## 13911             alive          joy
## 13912             alive     positive
## 13913             alive        trust
## 13914          powerful        anger
## 13915          powerful anticipation
## 13916          powerful      disgust
## 13917          powerful         fear
## 13918          powerful          joy
## 13919          powerful     positive
## 13920          powerful        trust
## 13921               war         fear
## 13922               war     negative
## 13923               war         fear
## 13924               war     negative
## 13925           hanging        anger
## 13926           hanging      disgust
## 13927           hanging         fear
## 13928           hanging     negative
## 13929           hanging      sadness
## 13930              fall     negative
## 13931              fall      sadness
## 13932          threaten        anger
## 13933          threaten anticipation
## 13934          threaten         fear
## 13935          threaten     negative
## 13936          collapse      disgust
## 13937          collapse         fear
## 13938          collapse     negative
## 13939          collapse      sadness
## 13940           economy        trust
## 13941             dying        anger
## 13942             dying      disgust
## 13943             dying         fear
## 13944             dying     negative
## 13945             dying      sadness
## 13946         existence     positive
## 13947           harmful        anger
## 13948           harmful      disgust
## 13949           harmful         fear
## 13950           harmful     negative
## 13951           harmful      sadness
## 13952              dire      disgust
## 13953              dire         fear
## 13954              dire     negative
## 13955              dire      sadness
## 13956              dire     surprise
## 13957              time anticipation
## 13958             lucky          joy
## 13959             lucky     positive
## 13960             lucky     surprise
## 13961           survive     positive
## 13962         destroyed        anger
## 13963         destroyed         fear
## 13964         destroyed     negative
## 13965         destroyed      sadness
## 13966          personal        trust
## 13967             level     positive
## 13968             level        trust
## 13969             agree     positive
## 13970              hell        anger
## 13971              hell      disgust
## 13972              hell         fear
## 13973              hell     negative
## 13974              hell      sadness
## 13975            bloody        anger
## 13976            bloody      disgust
## 13977            bloody         fear
## 13978            bloody     negative
## 13979            bloody      sadness
## 13980              land     positive
## 13981              soil      disgust
## 13982              soil     negative
## 13983       annihilated        anger
## 13984       annihilated         fear
## 13985       annihilated     negative
## 13986       annihilated      sadness
## 13987            forget     negative
## 13988              safe          joy
## 13989              safe     positive
## 13990              safe        trust
## 13991            lowest     negative
## 13992            lowest      sadness
## 13993            status     positive
## 13994            happen anticipation
## 13995             agree     positive
## 13996        successful anticipation
## 13997        successful          joy
## 13998        successful     positive
## 13999        successful        trust
## 14000         destroyed        anger
## 14001         destroyed         fear
## 14002         destroyed     negative
## 14003         destroyed      sadness
## 14004        completely     positive
## 14005           culture     positive
## 14006              risk anticipation
## 14007              risk         fear
## 14008              risk     negative
## 14009             money        anger
## 14010             money anticipation
## 14011             money          joy
## 14012             money     positive
## 14013             money     surprise
## 14014             money        trust
## 14015          continue anticipation
## 14016          continue     positive
## 14017          continue        trust
## 14018             build     positive
## 14019             greed        anger
## 14020             greed      disgust
## 14021             greed     negative
## 14022              shit        anger
## 14023              shit      disgust
## 14024              shit     negative
## 14025              evil        anger
## 14026              evil      disgust
## 14027              evil         fear
## 14028              evil     negative
## 14029              evil      sadness
## 14030            greedy      disgust
## 14031            greedy     negative
## 14032             enemy        anger
## 14033             enemy      disgust
## 14034             enemy         fear
## 14035             enemy     negative
## 14036               don     positive
## 14037               don        trust
## 14038             worry anticipation
## 14039             worry         fear
## 14040             worry     negative
## 14041             worry      sadness
## 14042              time anticipation
## 14043            budget        trust
## 14044             money        anger
## 14045             money anticipation
## 14046             money          joy
## 14047             money     positive
## 14048             money     surprise
## 14049             money        trust
## 14050               pay anticipation
## 14051               pay          joy
## 14052               pay     positive
## 14053               pay        trust
## 14054          fighting        anger
## 14055          fighting     negative
## 14056             peace anticipation
## 14057             peace          joy
## 14058             peace     positive
## 14059             peace        trust
## 14060              hell        anger
## 14061              hell      disgust
## 14062              hell         fear
## 14063              hell     negative
## 14064              hell      sadness
## 14065          conflict        anger
## 14066          conflict         fear
## 14067          conflict     negative
## 14068          conflict      sadness
## 14069            larger      disgust
## 14070            larger     surprise
## 14071            larger        trust
## 14072               war         fear
## 14073               war     negative
## 14074          constant     positive
## 14075          constant        trust
## 14076              hell        anger
## 14077              hell      disgust
## 14078              hell         fear
## 14079              hell     negative
## 14080              hell      sadness
## 14081              time anticipation
## 14082              shit        anger
## 14083              shit      disgust
## 14084              shit     negative
## 14085              shit        anger
## 14086              shit      disgust
## 14087              shit     negative
## 14088         beautiful          joy
## 14089         beautiful     positive
## 14090             worse         fear
## 14091             worse     negative
## 14092             worse      sadness
## 14093             worse         fear
## 14094             worse     negative
## 14095             worse      sadness
## 14096            agreed     positive
## 14097            agreed        trust
## 14098           feeling        anger
## 14099           feeling anticipation
## 14100           feeling      disgust
## 14101           feeling         fear
## 14102           feeling          joy
## 14103           feeling     negative
## 14104           feeling     positive
## 14105           feeling      sadness
## 14106           feeling     surprise
## 14107           feeling        trust
## 14108              doom         fear
## 14109              doom     negative
## 14110             gloom     negative
## 14111             gloom      sadness
## 14112          violence        anger
## 14113          violence         fear
## 14114          violence     negative
## 14115          violence      sadness
## 14116           endless        anger
## 14117           endless         fear
## 14118           endless          joy
## 14119           endless     negative
## 14120           endless     positive
## 14121           endless      sadness
## 14122           endless        trust
## 14123               bad        anger
## 14124               bad      disgust
## 14125               bad         fear
## 14126               bad     negative
## 14127               bad      sadness
## 14128              shit        anger
## 14129              shit      disgust
## 14130              shit     negative
## 14131            happen anticipation
## 14132               bad        anger
## 14133               bad      disgust
## 14134               bad         fear
## 14135               bad     negative
## 14136               bad      sadness
## 14137               bad        anger
## 14138               bad      disgust
## 14139               bad         fear
## 14140               bad     negative
## 14141               bad      sadness
## 14142        technology     positive
## 14143          delivery anticipation
## 14144          delivery     positive
## 14145       information     positive
## 14146               sky     positive
## 14147           falling     negative
## 14148           falling      sadness
## 14149             agree     positive
## 14150              save          joy
## 14151              save     positive
## 14152              save        trust
## 14153               don     positive
## 14154               don        trust
## 14155             wrong     negative
## 14156               don     positive
## 14157               don        trust
## 14158             guess     surprise
## 14159             agree     positive
## 14160              hate        anger
## 14161              hate      disgust
## 14162              hate         fear
## 14163              hate     negative
## 14164              hate      sadness
## 14165        liberation anticipation
## 14166        liberation          joy
## 14167        liberation     positive
## 14168        liberation     surprise
## 14169            wealth          joy
## 14170            wealth     positive
## 14171            wealth        trust
## 14172         depressed        anger
## 14173         depressed         fear
## 14174         depressed     negative
## 14175         depressed      sadness
## 14176           reading     positive
## 14177           excited anticipation
## 14178           excited          joy
## 14179           excited     positive
## 14180           excited     surprise
## 14181           excited        trust
## 14182           excited anticipation
## 14183           excited          joy
## 14184           excited     positive
## 14185           excited     surprise
## 14186           excited        trust
## 14187            public anticipation
## 14188            public     positive
## 14189     compassionate     positive
## 14190             level     positive
## 14191             level        trust
## 14192             alien      disgust
## 14193             alien         fear
## 14194             alien     negative
## 14195            broken        anger
## 14196            broken         fear
## 14197            broken     negative
## 14198            broken      sadness
## 14199             mouth     surprise
## 14200             alien      disgust
## 14201             alien         fear
## 14202             alien     negative
## 14203         surprised     surprise
## 14204            salary anticipation
## 14205            salary          joy
## 14206            salary     positive
## 14207            salary        trust
## 14208             words        anger
## 14209             words     negative
## 14210       information     positive
## 14211           benefit     positive
## 14212              mess      disgust
## 14213              mess     negative
## 14214             learn     positive
## 14215              food          joy
## 14216              food     positive
## 14217              food        trust
## 14218          familiar     positive
## 14219          familiar        trust
## 14220          minimize     negative
## 14221           contact     positive
## 14222            pretty anticipation
## 14223            pretty          joy
## 14224            pretty     positive
## 14225            pretty        trust
## 14226         celebrity        anger
## 14227         celebrity anticipation
## 14228         celebrity      disgust
## 14229         celebrity          joy
## 14230         celebrity     negative
## 14231         celebrity     positive
## 14232         celebrity     surprise
## 14233         celebrity        trust
## 14234            gossip     negative
## 14235           knowing     positive
## 14236            change         fear
## 14237              true          joy
## 14238              true     positive
## 14239              true        trust
## 14240              time anticipation
## 14241             level     positive
## 14242             level        trust
## 14243        government         fear
## 14244        government     negative
## 14245             draft anticipation
## 14246        government         fear
## 14247        government     negative
## 14248         confirmed     positive
## 14249         confirmed        trust
## 14250      intelligence         fear
## 14251      intelligence          joy
## 14252      intelligence     positive
## 14253      intelligence        trust
## 14254        government         fear
## 14255        government     negative
## 14256          congress      disgust
## 14257          congress        trust
## 14258          military         fear
## 14259               law        trust
## 14260         confirmed     positive
## 14261         confirmed        trust
## 14262             alien      disgust
## 14263             alien         fear
## 14264             alien     negative
## 14265      intelligence         fear
## 14266      intelligence          joy
## 14267      intelligence     positive
## 14268      intelligence        trust
## 14269           related        trust
## 14270          question     positive
## 14271            threat        anger
## 14272            threat         fear
## 14273            threat     negative
## 14274            threat        anger
## 14275            threat         fear
## 14276            threat     negative
## 14277              fear        anger
## 14278              fear         fear
## 14279              fear     negative
## 14280              rest     positive
## 14281             shock        anger
## 14282             shock         fear
## 14283             shock     negative
## 14284             shock     surprise
## 14285          tomorrow anticipation
## 14286               pay anticipation
## 14287               pay          joy
## 14288               pay     positive
## 14289               pay        trust
## 14290             worry anticipation
## 14291             worry         fear
## 14292             worry     negative
## 14293             worry      sadness
## 14294            change         fear
## 14295        technology     positive
## 14296             quest anticipation
## 14297             quest     positive
## 14298               pay anticipation
## 14299               pay          joy
## 14300               pay     positive
## 14301               pay        trust
## 14302        technology     positive
## 14303            secret        trust
## 14304             greed        anger
## 14305             greed      disgust
## 14306             greed     negative
## 14307          continue anticipation
## 14308          continue     positive
## 14309          continue        trust
## 14310          complain        anger
## 14311          complain     negative
## 14312          complain      sadness
## 14313             greed        anger
## 14314             greed      disgust
## 14315             greed     negative
## 14316          progress anticipation
## 14317          progress          joy
## 14318          progress     positive
## 14319          stagnant     negative
## 14320          stagnant      sadness
## 14321             worse         fear
## 14322             worse     negative
## 14323             worse      sadness
## 14324             alien      disgust
## 14325             alien         fear
## 14326             alien     negative
## 14327       inexpensive     positive
## 14328            create          joy
## 14329            create     positive
## 14330             money        anger
## 14331             money anticipation
## 14332             money          joy
## 14333             money     positive
## 14334             money     surprise
## 14335             money        trust
## 14336             alien      disgust
## 14337             alien         fear
## 14338             alien     negative
## 14339           benefit     positive
## 14340             agree     positive
## 14341             greed        anger
## 14342             greed      disgust
## 14343             greed     negative
## 14344           culture     positive
## 14345           culture     positive
## 14346            occult      disgust
## 14347            occult         fear
## 14348            occult     negative
## 14349           magical anticipation
## 14350           magical          joy
## 14351           magical     positive
## 14352           magical     surprise
## 14353               god anticipation
## 14354               god         fear
## 14355               god          joy
## 14356               god     positive
## 14357               god        trust
## 14358     complementary     positive
## 14359             learn     positive
## 14360            create          joy
## 14361            create     positive
## 14362             watch anticipation
## 14363             watch         fear
## 14364             watch anticipation
## 14365             watch         fear
## 14366               god anticipation
## 14367               god         fear
## 14368               god          joy
## 14369               god     positive
## 14370               god        trust
## 14371           magical anticipation
## 14372           magical          joy
## 14373           magical     positive
## 14374           magical     surprise
## 14375        scientific     positive
## 14376        scientific        trust
## 14377             watch anticipation
## 14378             watch         fear
## 14379              deal anticipation
## 14380              deal          joy
## 14381              deal     positive
## 14382              deal     surprise
## 14383              deal        trust
## 14384           magical anticipation
## 14385           magical          joy
## 14386           magical     positive
## 14387           magical     surprise
## 14388            master     positive
## 14389         discredit     negative
## 14390              shit        anger
## 14391              shit      disgust
## 14392              shit     negative
## 14393               bum      disgust
## 14394               bum     negative
## 14395               bum      sadness
## 14396        government         fear
## 14397        government     negative
## 14398           rightly     positive
## 14399              real     positive
## 14400              real        trust
## 14401               don     positive
## 14402               don        trust
## 14403      confirmation        trust
## 14404             force        anger
## 14405             force         fear
## 14406             force     negative
## 14407          relevant     positive
## 14408          relevant        trust
## 14409            happen anticipation
## 14410              time anticipation
## 14411      civilization     positive
## 14412      civilization        trust
## 14413        technology     positive
## 14414           benefit     positive
## 14415            happen anticipation
## 14416              save          joy
## 14417              save     positive
## 14418              save        trust
## 14419           feeling        anger
## 14420           feeling anticipation
## 14421           feeling      disgust
## 14422           feeling         fear
## 14423           feeling          joy
## 14424           feeling     negative
## 14425           feeling     positive
## 14426           feeling      sadness
## 14427           feeling     surprise
## 14428           feeling        trust
## 14429            status     positive
## 14430      intelligence         fear
## 14431      intelligence          joy
## 14432      intelligence     positive
## 14433      intelligence        trust
## 14434      interference     negative
## 14435               war         fear
## 14436               war     negative
## 14437            loving          joy
## 14438            loving     positive
## 14439            loving        trust
## 14440              time anticipation
## 14441             haven     positive
## 14442             haven        trust
## 14443            intact     positive
## 14444            intact        trust
## 14445               war         fear
## 14446               war     negative
## 14447        aggression        anger
## 14448        aggression         fear
## 14449        aggression     negative
## 14450              fear        anger
## 14451              fear         fear
## 14452              fear     negative
## 14453             alien      disgust
## 14454             alien         fear
## 14455             alien     negative
## 14456              time anticipation
## 14457             abuse        anger
## 14458             abuse      disgust
## 14459             abuse         fear
## 14460             abuse     negative
## 14461             abuse      sadness
## 14462           neglect     negative
## 14463           hopeful anticipation
## 14464           hopeful          joy
## 14465           hopeful     positive
## 14466           hopeful     surprise
## 14467           hopeful        trust
## 14468             bleak     negative
## 14469             bleak      sadness
## 14470            pretty anticipation
## 14471            pretty          joy
## 14472            pretty     positive
## 14473            pretty        trust
## 14474            status     positive
## 14475           vaccine     positive
## 14476          solution     positive
## 14477     unprecedented     surprise
## 14478        conspiracy         fear
## 14479             truth     positive
## 14480             truth        trust
## 14481         impending anticipation
## 14482         impending         fear
## 14483       destructive        anger
## 14484       destructive      disgust
## 14485       destructive         fear
## 14486       destructive     negative
## 14487            threat        anger
## 14488            threat         fear
## 14489            threat     negative
## 14490              fear        anger
## 14491              fear         fear
## 14492              fear     negative
## 14493        experiment anticipation
## 14494        experiment     surprise
## 14495            pretty anticipation
## 14496            pretty          joy
## 14497            pretty     positive
## 14498            pretty        trust
## 14499           obvious     positive
## 14500           obvious        trust
## 14501           unknown anticipation
## 14502           unknown         fear
## 14503           unknown     negative
## 14504             worse         fear
## 14505             worse     negative
## 14506             worse      sadness
## 14507            happen anticipation
## 14508           idiotic        anger
## 14509           idiotic      disgust
## 14510           idiotic     negative
## 14511          suddenly     surprise
## 14512             level     positive
## 14513             level        trust
## 14514         knowledge     positive
## 14515              fear        anger
## 14516              fear         fear
## 14517              fear     negative
## 14518          continue anticipation
## 14519          continue     positive
## 14520          continue        trust
## 14521          majority          joy
## 14522          majority     positive
## 14523          majority        trust
## 14524          optimist     positive
## 14525          optimist        trust
## 14526          peaceful anticipation
## 14527          peaceful          joy
## 14528          peaceful     positive
## 14529          peaceful     surprise
## 14530          peaceful        trust
## 14531              time anticipation
## 14532            lowest     negative
## 14533            lowest      sadness
## 14534             level     positive
## 14535             level        trust
## 14536           poverty        anger
## 14537           poverty      disgust
## 14538           poverty         fear
## 14539           poverty     negative
## 14540           poverty      sadness
## 14541           gradual anticipation
## 14542        accelerate anticipation
## 14543              hope anticipation
## 14544              hope          joy
## 14545              hope     positive
## 14546              hope     surprise
## 14547              hope        trust
## 14548            happen anticipation
## 14549              star anticipation
## 14550              star          joy
## 14551              star     positive
## 14552              star        trust
## 14553           contact     positive
## 14554           poverty        anger
## 14555           poverty      disgust
## 14556           poverty         fear
## 14557           poverty     negative
## 14558           poverty      sadness
## 14559              hope anticipation
## 14560              hope          joy
## 14561              hope     positive
## 14562              hope     surprise
## 14563              hope        trust
## 14564              glad anticipation
## 14565              glad          joy
## 14566              glad     positive
## 14567               don     positive
## 14568               don        trust
## 14569               don     positive
## 14570               don        trust
## 14571            system        trust
## 14572             greed        anger
## 14573             greed      disgust
## 14574             greed     negative
## 14575         breakdown     negative
## 14576            system        trust
## 14577             worse         fear
## 14578             worse     negative
## 14579             worse      sadness
## 14580            system        trust
## 14581           killing        anger
## 14582           killing         fear
## 14583           killing     negative
## 14584           killing      sadness
## 14585            system        trust
## 14586               bad        anger
## 14587               bad      disgust
## 14588               bad         fear
## 14589               bad     negative
## 14590               bad      sadness
## 14591         pollution      disgust
## 14592         pollution     negative
## 14593       degradation     negative
## 14594              cool     positive
## 14595           knowing     positive
## 14596             words        anger
## 14597             words     negative
## 14598             mouth     surprise
## 14599             trade        trust
## 14600             money        anger
## 14601             money anticipation
## 14602             money          joy
## 14603             money     positive
## 14604             money     surprise
## 14605             money        trust
## 14606              evil        anger
## 14607              evil      disgust
## 14608              evil         fear
## 14609              evil     negative
## 14610              evil      sadness
## 14611               god anticipation
## 14612               god         fear
## 14613               god          joy
## 14614               god     positive
## 14615               god        trust
## 14616              hope anticipation
## 14617              hope          joy
## 14618              hope     positive
## 14619              hope     surprise
## 14620              hope        trust
## 14621              love          joy
## 14622              love     positive
## 14623             money        anger
## 14624             money anticipation
## 14625             money          joy
## 14626             money     positive
## 14627             money     surprise
## 14628             money        trust
## 14629              evil        anger
## 14630              evil      disgust
## 14631              evil         fear
## 14632              evil     negative
## 14633              evil      sadness
## 14634              love          joy
## 14635              love     positive
## 14636             money        anger
## 14637             money anticipation
## 14638             money          joy
## 14639             money     positive
## 14640             money     surprise
## 14641             money        trust
## 14642              evil        anger
## 14643              evil      disgust
## 14644              evil         fear
## 14645              evil     negative
## 14646              evil      sadness
## 14647             greed        anger
## 14648             greed      disgust
## 14649             greed     negative
## 14650             greed        anger
## 14651             greed      disgust
## 14652             greed     negative
## 14653        corruption      disgust
## 14654        corruption     negative
## 14655            create          joy
## 14656            create     positive
## 14657             level     positive
## 14658             level        trust
## 14659            wealth          joy
## 14660            wealth     positive
## 14661            wealth        trust
## 14662         socialist        anger
## 14663         socialist      disgust
## 14664         socialist         fear
## 14665         socialist     negative
## 14666         socialist      sadness
## 14667            system        trust
## 14668              food          joy
## 14669              food     positive
## 14670              food        trust
## 14671            scarce         fear
## 14672            scarce     negative
## 14673            scarce      sadness
## 14674            create          joy
## 14675            create     positive
## 14676          organize     positive
## 14677         resources          joy
## 14678         resources     positive
## 14679         resources        trust
## 14680               lie        anger
## 14681               lie      disgust
## 14682               lie     negative
## 14683               lie      sadness
## 14684            system        trust
## 14685          wasteful        anger
## 14686          wasteful      disgust
## 14687          wasteful     negative
## 14688          wasteful      sadness
## 14689         efficient anticipation
## 14690         efficient     positive
## 14691         efficient        trust
## 14692            margin     negative
## 14693            margin      sadness
## 14694           provide     positive
## 14695           provide        trust
## 14696         resources          joy
## 14697         resources     positive
## 14698         resources        trust
## 14699            change         fear
## 14700              food          joy
## 14701              food     positive
## 14702              food        trust
## 14703           healing anticipation
## 14704           healing          joy
## 14705           healing     positive
## 14706           healing        trust
## 14707          starving     negative
## 14708             focus     positive
## 14709         community     positive
## 14710          intended anticipation
## 14711          intended     positive
## 14712             agree     positive
## 14713          intended anticipation
## 14714          intended     positive
## 14715             labor anticipation
## 14716             labor          joy
## 14717             labor     positive
## 14718             labor     surprise
## 14719             labor        trust
## 14720               law        trust
## 14721             trust        trust
## 14722              muck      disgust
## 14723              muck     negative
## 14724            crisis     negative
## 14725             worth     positive
## 14726          powerful        anger
## 14727          powerful anticipation
## 14728          powerful      disgust
## 14729          powerful         fear
## 14730          powerful          joy
## 14731          powerful     positive
## 14732          powerful        trust
## 14733             haven     positive
## 14734             haven        trust
## 14735         knowledge     positive
## 14736             lower     negative
## 14737             lower      sadness
## 14738              true          joy
## 14739              true     positive
## 14740              true        trust
## 14741           worried     negative
## 14742           worried      sadness
## 14743             worse         fear
## 14744             worse     negative
## 14745             worse      sadness
## 14746           feeling        anger
## 14747           feeling anticipation
## 14748           feeling      disgust
## 14749           feeling         fear
## 14750           feeling          joy
## 14751           feeling     negative
## 14752           feeling     positive
## 14753           feeling      sadness
## 14754           feeling     surprise
## 14755           feeling        trust
## 14756            assist     positive
## 14757            assist        trust
## 14758            action     positive
## 14759           hostile        anger
## 14760           hostile      disgust
## 14761           hostile         fear
## 14762           hostile     negative
## 14763          shooting        anger
## 14764          shooting         fear
## 14765          shooting     negative
## 14766               sky     positive
## 14767              kill         fear
## 14768              kill     negative
## 14769              kill      sadness
## 14770             start anticipation
## 14771          shooting        anger
## 14772          shooting         fear
## 14773          shooting     negative
## 14774       immediately anticipation
## 14775       immediately     negative
## 14776       immediately     positive
## 14777            happen anticipation
## 14778             award anticipation
## 14779             award          joy
## 14780             award     positive
## 14781             award     surprise
## 14782             award        trust
## 14783              shit        anger
## 14784              shit      disgust
## 14785              shit     negative
## 14786              fits        anger
## 14787              fits     negative
## 14788            pistol     negative
## 14789             spoke     negative
## 14790         communism        anger
## 14791         communism         fear
## 14792         communism     negative
## 14793         communism      sadness
## 14794               die         fear
## 14795               die     negative
## 14796               die      sadness
## 14797          fighting        anger
## 14798          fighting     negative
## 14799           protect     positive
## 14800             worse         fear
## 14801             worse     negative
## 14802             worse      sadness
## 14803         confirmed     positive
## 14804         confirmed        trust
## 14805             alien      disgust
## 14806             alien         fear
## 14807             alien     negative
## 14808             trash      disgust
## 14809             trash     negative
## 14810             trash      sadness
## 14811              love          joy
## 14812              love     positive
## 14813              rock     positive
## 14814            wealth          joy
## 14815            wealth     positive
## 14816            wealth        trust
## 14817         disparity        anger
## 14818         disparity      disgust
## 14819         disparity     negative
## 14820         disparity      sadness
## 14821          abundant          joy
## 14822          abundant     positive
## 14823              time anticipation
## 14824          majority          joy
## 14825          majority     positive
## 14826          majority        trust
## 14827              deal anticipation
## 14828              deal          joy
## 14829              deal     positive
## 14830              deal     surprise
## 14831              deal        trust
## 14832          abundant          joy
## 14833          abundant     positive
## 14834              time anticipation
## 14835              true          joy
## 14836              true     positive
## 14837              true        trust
## 14838              hell        anger
## 14839              hell      disgust
## 14840              hell         fear
## 14841              hell     negative
## 14842              hell      sadness
## 14843         suffering      disgust
## 14844         suffering         fear
## 14845         suffering     negative
## 14846         suffering      sadness
## 14847            brutal        anger
## 14848            brutal         fear
## 14849            brutal     negative
## 14850           disease        anger
## 14851           disease      disgust
## 14852           disease         fear
## 14853           disease     negative
## 14854           disease      sadness
## 14855             worse         fear
## 14856             worse     negative
## 14857             worse      sadness
## 14858       advancement     positive
## 14859          stagnant     negative
## 14860          stagnant      sadness
## 14861             dying        anger
## 14862             dying      disgust
## 14863             dying         fear
## 14864             dying     negative
## 14865             dying      sadness
## 14866            crisis     negative
## 14867               top anticipation
## 14868               top     positive
## 14869               top        trust
## 14870             dying        anger
## 14871             dying      disgust
## 14872             dying         fear
## 14873             dying     negative
## 14874             dying      sadness
## 14875         suffering      disgust
## 14876         suffering         fear
## 14877         suffering     negative
## 14878         suffering      sadness
## 14879              evil        anger
## 14880              evil      disgust
## 14881              evil         fear
## 14882              evil     negative
## 14883              evil      sadness
## 14884             guess     surprise
## 14885         objective anticipation
## 14886         objective     positive
## 14887         objective        trust
## 14888           measure        trust
## 14889               war         fear
## 14890               war     negative
## 14891          violence        anger
## 14892          violence         fear
## 14893          violence     negative
## 14894          violence      sadness
## 14895           disease        anger
## 14896           disease      disgust
## 14897           disease         fear
## 14898           disease     negative
## 14899           disease      sadness
## 14900             wrong     negative
## 14901         mortality        anger
## 14902         mortality         fear
## 14903         mortality     negative
## 14904         mortality      sadness
## 14905        expectancy anticipation
## 14906            wealth          joy
## 14907            wealth     positive
## 14908            wealth        trust
## 14909               don     positive
## 14910               don        trust
## 14911              time anticipation
## 14912     unprecedented     surprise
## 14913           horizon anticipation
## 14914           horizon     positive
## 14915             greed        anger
## 14916             greed      disgust
## 14917             greed     negative
## 14918          inaction     negative
## 14919           ability     positive
## 14920         precipice         fear
## 14921            coming anticipation
## 14922        regression     negative
## 14923        aberration      disgust
## 14924        aberration     negative
## 14925        aberration      disgust
## 14926        aberration     negative
## 14927     unsustainable     negative
## 14928            suffer     negative
## 14929             alive anticipation
## 14930             alive          joy
## 14931             alive     positive
## 14932             alive        trust
## 14933               don     positive
## 14934               don        trust
## 14935        completely     positive
## 14936          horrible        anger
## 14937          horrible      disgust
## 14938          horrible         fear
## 14939          horrible     negative
## 14940            giving     positive
## 14941          continue anticipation
## 14942          continue     positive
## 14943          continue        trust
## 14944         happiness anticipation
## 14945         happiness          joy
## 14946         happiness     positive
## 14947          fighting        anger
## 14948          fighting     negative
## 14949          tomorrow anticipation
## 14950        technology     positive
## 14951            crisis     negative
## 14952           justice     positive
## 14953           justice        trust
## 14954              true          joy
## 14955              true     positive
## 14956              true        trust
## 14957            demand        anger
## 14958            demand     negative
## 14959            modest     positive
## 14960            modest        trust
## 14961            rising anticipation
## 14962            rising          joy
## 14963            rising     positive
## 14964            change         fear
## 14965            coming anticipation
## 14966              hope anticipation
## 14967              hope          joy
## 14968              hope     positive
## 14969              hope     surprise
## 14970              hope        trust
## 14971            coming anticipation
## 14972            damage        anger
## 14973            damage      disgust
## 14974            damage     negative
## 14975            damage      sadness
## 14976            suffer     negative
## 14977            coming anticipation
## 14978            excuse     negative
## 14979              hope anticipation
## 14980              hope          joy
## 14981              hope     positive
## 14982              hope     surprise
## 14983              hope        trust
## 14984              time anticipation
## 14985        ungrateful        anger
## 14986        ungrateful      disgust
## 14987        ungrateful     negative
## 14988              fits        anger
## 14989              fits     negative
## 14990             cheap     negative
## 14991          standing     positive
## 14992            dinner     positive
## 14993              food          joy
## 14994              food     positive
## 14995              food        trust
## 14996              fair     positive
## 14997          relative        trust
## 14998           comfort anticipation
## 14999           comfort          joy
## 15000           comfort     positive
## 15001           comfort        trust
## 15002             erase         fear
## 15003             erase     negative
## 15004          minimize     negative
## 15005         suffering      disgust
## 15006         suffering         fear
## 15007         suffering     negative
## 15008         suffering      sadness
## 15009            wealth          joy
## 15010            wealth     positive
## 15011            wealth        trust
## 15012       enslavement     negative
## 15013        population     positive
## 15014          childish     negative
## 15015            salary anticipation
## 15016            salary          joy
## 15017            salary     positive
## 15018            salary        trust
## 15019      neighborhood anticipation
## 15020            decent     positive
## 15021            income anticipation
## 15022            income          joy
## 15023            income     negative
## 15024            income     positive
## 15025            income      sadness
## 15026            income        trust
## 15027             wages          joy
## 15028             wages     positive
## 15029              food          joy
## 15030              food     positive
## 15031              food        trust
## 15032       grandfather        trust
## 15033        ungrateful        anger
## 15034        ungrateful      disgust
## 15035        ungrateful     negative
## 15036            demand        anger
## 15037            demand     negative
## 15038            supply     positive
## 15039         inflation         fear
## 15040         inflation     negative
## 15041             worse         fear
## 15042             worse     negative
## 15043             worse      sadness
## 15044            rocket        anger
## 15045          fighting        anger
## 15046          fighting     negative
## 15047               war         fear
## 15048               war     negative
## 15049             shape     positive
## 15050              true          joy
## 15051              true     positive
## 15052              true        trust
## 15053               don     positive
## 15054               don        trust
## 15055             worry anticipation
## 15056             worry         fear
## 15057             worry     negative
## 15058             worry      sadness
## 15059              time anticipation
## 15060            coming anticipation
## 15061              save          joy
## 15062              save     positive
## 15063              save        trust
## 15064        technology     positive
## 15065            hidden     negative
## 15066        disconnect     negative
## 15067        disconnect      sadness
## 15068              real     positive
## 15069              real        trust
## 15070              shit        anger
## 15071              shit      disgust
## 15072              shit     negative
## 15073               bad        anger
## 15074               bad      disgust
## 15075               bad         fear
## 15076               bad     negative
## 15077               bad      sadness
## 15078              time anticipation
## 15079          progress anticipation
## 15080          progress          joy
## 15081          progress     positive
## 15082              shit        anger
## 15083              shit      disgust
## 15084              shit     negative
## 15085             worse         fear
## 15086             worse     negative
## 15087             worse      sadness
## 15088              shit        anger
## 15089              shit      disgust
## 15090              shit     negative
## 15091           slavery        anger
## 15092           slavery      disgust
## 15093           slavery         fear
## 15094           slavery     negative
## 15095           slavery      sadness
## 15096            change         fear
## 15097               don     positive
## 15098               don        trust
## 15099            rising anticipation
## 15100            rising          joy
## 15101            rising     positive
## 15102            coming anticipation
## 15103            wealth          joy
## 15104            wealth     positive
## 15105            wealth        trust
## 15106              belt        anger
## 15107              belt         fear
## 15108              belt     negative
## 15109             worse         fear
## 15110             worse     negative
## 15111             worse      sadness
## 15112              true          joy
## 15113              true     positive
## 15114              true        trust
## 15115               don     positive
## 15116               don        trust
## 15117        distraught     negative
## 15118        distraught      sadness
## 15119               don     positive
## 15120               don        trust
## 15121             start anticipation
## 15122             crazy        anger
## 15123             crazy         fear
## 15124             crazy     negative
## 15125             crazy      sadness
## 15126          advanced     positive
## 15127             sense     positive
## 15128             worth     positive
## 15129             waste      disgust
## 15130             waste     negative
## 15131              time anticipation
## 15132            afraid         fear
## 15133            afraid     negative
## 15134            actual     positive
## 15135           violent        anger
## 15136           violent      disgust
## 15137           violent         fear
## 15138           violent     negative
## 15139           violent     surprise
## 15140            stupid     negative
## 15141          humanity          joy
## 15142          humanity     positive
## 15143          humanity        trust
## 15144             major     positive
## 15145        government         fear
## 15146        government     negative
## 15147             waste      disgust
## 15148             waste     negative
## 15149         resources          joy
## 15150         resources     positive
## 15151         resources        trust
## 15152               die         fear
## 15153               die     negative
## 15154               die      sadness
## 15155         infection         fear
## 15156         infection     negative
## 15157              lose        anger
## 15158              lose      disgust
## 15159              lose         fear
## 15160              lose     negative
## 15161              lose      sadness
## 15162              lose     surprise
## 15163       probability anticipation
## 15164            change         fear
## 15165               war         fear
## 15166               war     negative
## 15167        technology     positive
## 15168           prepare anticipation
## 15169           prepare     positive
## 15170           perfect anticipation
## 15171           perfect          joy
## 15172           perfect     positive
## 15173           perfect        trust
## 15174             worse         fear
## 15175             worse     negative
## 15176             worse      sadness
## 15177     disrespectful        anger
## 15178     disrespectful      disgust
## 15179     disrespectful         fear
## 15180     disrespectful     negative
## 15181     disrespectful      sadness
## 15182               cop         fear
## 15183               cop        trust
## 15184             truth     positive
## 15185             truth        trust
## 15186            chance     surprise
## 15187           refusal     negative
## 15188          progress anticipation
## 15189          progress          joy
## 15190          progress     positive
## 15191           poverty        anger
## 15192           poverty      disgust
## 15193           poverty         fear
## 15194           poverty     negative
## 15195           poverty      sadness
## 15196        constantly        trust
## 15197        technology     positive
## 15198             green          joy
## 15199             green     positive
## 15200             green        trust
## 15201           decline     negative
## 15202        population     positive
## 15203            change         fear
## 15204            change         fear
## 15205              time anticipation
## 15206           glacial     negative
## 15207           minimum     negative
## 15208            reason     positive
## 15209               bad        anger
## 15210               bad      disgust
## 15211               bad         fear
## 15212               bad     negative
## 15213               bad      sadness
## 15214           glacial     negative
## 15215           maximum     positive
## 15216            cancer        anger
## 15217            cancer      disgust
## 15218            cancer         fear
## 15219            cancer     negative
## 15220            cancer      sadness
## 15221              hope anticipation
## 15222              hope          joy
## 15223              hope     positive
## 15224              hope     surprise
## 15225              hope        trust
## 15226        propaganda     negative
## 15227             gross      disgust
## 15228             gross     negative
## 15229            change         fear
## 15230          dreadful        anger
## 15231          dreadful anticipation
## 15232          dreadful      disgust
## 15233          dreadful         fear
## 15234          dreadful     negative
## 15235          dreadful      sadness
## 15236               job     positive
## 15237          improved     positive
## 15238          nonsense     negative
## 15239            denial     negative
## 15240          nonsense     negative
## 15241        scientific     positive
## 15242        scientific        trust
## 15243         fortitude          joy
## 15244         fortitude     positive
## 15245         fortitude        trust
## 15246              hope anticipation
## 15247              hope          joy
## 15248              hope     positive
## 15249              hope     surprise
## 15250              hope        trust
## 15251            denial     negative
## 15252           despair        anger
## 15253           despair      disgust
## 15254           despair         fear
## 15255           despair     negative
## 15256           despair      sadness
## 15257            public anticipation
## 15258            public     positive
## 15259           helpful          joy
## 15260           helpful     positive
## 15261           helpful        trust
## 15262      indifference        anger
## 15263      indifference      disgust
## 15264      indifference         fear
## 15265      indifference     negative
## 15266      indifference      sadness
## 15267          arrogant        anger
## 15268          arrogant      disgust
## 15269          arrogant     negative
## 15270            greedy      disgust
## 15271            greedy     negative
## 15272              kill         fear
## 15273              kill     negative
## 15274              kill      sadness
## 15275            actual     positive
## 15276            denial     negative
## 15277          minority     negative
## 15278            public anticipation
## 15279            public     positive
## 15280         community     positive
## 15281         suffering      disgust
## 15282         suffering         fear
## 15283         suffering     negative
## 15284         suffering      sadness
## 15285            denial     negative
## 15286            victim        anger
## 15287            victim         fear
## 15288            victim     negative
## 15289            victim      sadness
## 15290             crazy        anger
## 15291             crazy         fear
## 15292             crazy     negative
## 15293             crazy      sadness
## 15294             alien      disgust
## 15295             alien         fear
## 15296             alien     negative
## 15297           culture     positive
## 15298            taught        trust
## 15299             study     positive
## 15300            taught        trust
## 15301             truth     positive
## 15302             truth        trust
## 15303            change         fear
## 15304              cool     positive
## 15305              shed     negative
## 15306          nonsense     negative
## 15307          rational     positive
## 15308          rational        trust
## 15309             sense     positive
## 15310              shit        anger
## 15311              shit      disgust
## 15312              shit     negative
## 15313              cold     negative
## 15314               war         fear
## 15315               war     negative
## 15316              real     positive
## 15317              real        trust
## 15318       possibility anticipation
## 15319            coming anticipation
## 15320              cold     negative
## 15321               war         fear
## 15322               war     negative
## 15323         miserable        anger
## 15324         miserable      disgust
## 15325         miserable     negative
## 15326         miserable      sadness
## 15327            afford     positive
## 15328        oppressive        anger
## 15329        oppressive      disgust
## 15330        oppressive         fear
## 15331        oppressive     negative
## 15332        oppressive      sadness
## 15333          horrible        anger
## 15334          horrible      disgust
## 15335          horrible         fear
## 15336          horrible     negative
## 15337          terrible        anger
## 15338          terrible      disgust
## 15339          terrible         fear
## 15340          terrible     negative
## 15341          terrible      sadness
## 15342             worse         fear
## 15343             worse     negative
## 15344             worse      sadness
## 15345         difficult         fear
## 15346         happiness anticipation
## 15347         happiness          joy
## 15348         happiness     positive
## 15349        completely     positive
## 15350            forget     negative
## 15351               bad        anger
## 15352               bad      disgust
## 15353               bad         fear
## 15354               bad     negative
## 15355               bad      sadness
## 15356          continue anticipation
## 15357          continue     positive
## 15358          continue        trust
## 15359             fault     negative
## 15360             fault      sadness
## 15361           feeling        anger
## 15362           feeling anticipation
## 15363           feeling      disgust
## 15364           feeling         fear
## 15365           feeling          joy
## 15366           feeling     negative
## 15367           feeling     positive
## 15368           feeling      sadness
## 15369           feeling     surprise
## 15370           feeling        trust
## 15371           jealous        anger
## 15372           jealous      disgust
## 15373           jealous     negative
## 15374            elders     positive
## 15375            elders        trust
## 15376             fault     negative
## 15377             fault      sadness
## 15378           achieve          joy
## 15379           achieve     positive
## 15380           achieve        trust
## 15381              time anticipation
## 15382              late     negative
## 15383              late      sadness
## 15384              hell        anger
## 15385              hell      disgust
## 15386              hell         fear
## 15387              hell     negative
## 15388              hell      sadness
## 15389             beast        anger
## 15390             beast         fear
## 15391             beast     negative
## 15392          humanity          joy
## 15393          humanity     positive
## 15394          humanity        trust
## 15395             bitch        anger
## 15396             bitch      disgust
## 15397             bitch         fear
## 15398             bitch     negative
## 15399             bitch      sadness
## 15400               bad        anger
## 15401               bad      disgust
## 15402               bad         fear
## 15403               bad     negative
## 15404               bad      sadness
## 15405         guarantee     positive
## 15406         guarantee        trust
## 15407     participation     positive
## 15408            create          joy
## 15409            create     positive
## 15410               pay anticipation
## 15411               pay          joy
## 15412               pay     positive
## 15413               pay        trust
## 15414              true          joy
## 15415              true     positive
## 15416              true        trust
## 15417              true          joy
## 15418              true     positive
## 15419              true        trust
## 15420            crisis     negative
## 15421               war         fear
## 15422               war     negative
## 15423         wonderful          joy
## 15424         wonderful     positive
## 15425         wonderful     surprise
## 15426         wonderful        trust
## 15427         destroyed        anger
## 15428         destroyed         fear
## 15429         destroyed     negative
## 15430         destroyed      sadness
## 15431            tackle        anger
## 15432            tackle     surprise
## 15433             inter     negative
## 15434             inter      sadness
## 15435            change         fear
## 15436             alien      disgust
## 15437             alien         fear
## 15438             alien     negative
## 15439             crazy        anger
## 15440             crazy         fear
## 15441             crazy     negative
## 15442             crazy      sadness
## 15443              shit        anger
## 15444              shit      disgust
## 15445              shit     negative
## 15446          restrict     negative
## 15447          restrict      sadness
## 15448      civilization     positive
## 15449      civilization        trust
## 15450             visit     positive
## 15451            steady     surprise
## 15452            steady        trust
## 15453              shit        anger
## 15454              shit      disgust
## 15455              shit     negative
## 15456               don     positive
## 15457               don        trust
## 15458              love          joy
## 15459              love     positive
## 15460         feudalism        anger
## 15461         feudalism     negative
## 15462         feudalism      sadness
## 15463              true          joy
## 15464              true     positive
## 15465              true        trust
## 15466              suck     negative
## 15467           killing        anger
## 15468           killing         fear
## 15469           killing     negative
## 15470           killing      sadness
## 15471             money        anger
## 15472             money anticipation
## 15473             money          joy
## 15474             money     positive
## 15475             money     surprise
## 15476             money        trust
## 15477             money        anger
## 15478             money anticipation
## 15479             money          joy
## 15480             money     positive
## 15481             money     surprise
## 15482             money        trust
## 15483             money        anger
## 15484             money anticipation
## 15485             money          joy
## 15486             money     positive
## 15487             money     surprise
## 15488             money        trust
## 15489            income anticipation
## 15490            income          joy
## 15491            income     negative
## 15492            income     positive
## 15493            income      sadness
## 15494            income        trust
## 15495            secret        trust
## 15496             money        anger
## 15497             money anticipation
## 15498             money          joy
## 15499             money     positive
## 15500             money     surprise
## 15501             money        trust
## 15502              fill        trust
## 15503             money        anger
## 15504             money anticipation
## 15505             money          joy
## 15506             money     positive
## 15507             money     surprise
## 15508             money        trust
## 15509           warrior        anger
## 15510           warrior         fear
## 15511           warrior     positive
## 15512            victim        anger
## 15513            victim         fear
## 15514            victim     negative
## 15515            victim      sadness
## 15516          continue anticipation
## 15517          continue     positive
## 15518          continue        trust
## 15519        destroying        anger
## 15520        destroying         fear
## 15521        destroying     negative
## 15522        destroying      sadness
## 15523             agree     positive
## 15524            chance     surprise
## 15525              hope anticipation
## 15526              hope          joy
## 15527              hope     positive
## 15528              hope     surprise
## 15529              hope        trust
## 15530              hope anticipation
## 15531              hope          joy
## 15532              hope     positive
## 15533              hope     surprise
## 15534              hope        trust
## 15535           success anticipation
## 15536           success          joy
## 15537           success     positive
## 15538             alien      disgust
## 15539             alien         fear
## 15540             alien     negative
## 15541        technology     positive
## 15542             stone        anger
## 15543             stone     negative
## 15544             start anticipation
## 15545         difficult         fear
## 15546              hope anticipation
## 15547              hope          joy
## 15548              hope     positive
## 15549              hope     surprise
## 15550              hope        trust
## 15551            retain        trust
## 15552          humanity          joy
## 15553          humanity     positive
## 15554          humanity        trust
## 15555           respect anticipation
## 15556           respect          joy
## 15557           respect     positive
## 15558           respect        trust
## 15559            feudal     negative
## 15560              lack     negative
## 15561            chance     surprise
## 15562            wealth          joy
## 15563            wealth     positive
## 15564            wealth        trust
## 15565          horrible        anger
## 15566          horrible      disgust
## 15567          horrible         fear
## 15568          horrible     negative
## 15569         construct     positive
## 15570              hope anticipation
## 15571              hope          joy
## 15572              hope     positive
## 15573              hope     surprise
## 15574              hope        trust
## 15575        technology     positive
## 15576              lush      disgust
## 15577              lush     negative
## 15578              lush      sadness
## 15579           provide     positive
## 15580           provide        trust
## 15581              time anticipation
## 15582           related        trust
## 15583            reason     positive
## 15584         president     positive
## 15585         president        trust
## 15586              star anticipation
## 15587              star          joy
## 15588              star     positive
## 15589              star        trust
## 15590        technology     positive
## 15591             shoot        anger
## 15592             shoot         fear
## 15593             shoot     negative
## 15594               cue anticipation
## 15595         recommend     positive
## 15596         recommend        trust
## 15597           reading     positive
## 15598              true          joy
## 15599              true     positive
## 15600              true        trust
## 15601           slavery        anger
## 15602           slavery      disgust
## 15603           slavery         fear
## 15604           slavery     negative
## 15605           slavery      sadness
## 15606             offer     positive
## 15607            change         fear
## 15608             offer     positive
## 15609            change         fear
## 15610               bad        anger
## 15611               bad      disgust
## 15612               bad         fear
## 15613               bad     negative
## 15614               bad      sadness
## 15615              mess      disgust
## 15616              mess     negative
## 15617           wishful anticipation
## 15618          strongly     positive
## 15619           feeling        anger
## 15620           feeling anticipation
## 15621           feeling      disgust
## 15622           feeling         fear
## 15623           feeling          joy
## 15624           feeling     negative
## 15625           feeling     positive
## 15626           feeling      sadness
## 15627           feeling     surprise
## 15628           feeling        trust
## 15629            happen anticipation
## 15630              true          joy
## 15631              true     positive
## 15632              true        trust
## 15633             haven     positive
## 15634             haven        trust
## 15635              real     positive
## 15636              real        trust
## 15637             level     positive
## 15638             level        trust
## 15639              real     positive
## 15640              real        trust
## 15641            status     positive
## 15642             break     surprise
## 15643    disinformation        anger
## 15644    disinformation         fear
## 15645    disinformation     negative
## 15646          distract     negative
## 15647              hope anticipation
## 15648              hope          joy
## 15649              hope     positive
## 15650              hope     surprise
## 15651              hope        trust
## 15652       immortality anticipation
## 15653             craft     positive
## 15654          advanced     positive
## 15655         knowledge     positive
## 15656             words        anger
## 15657             words     negative
## 15658               don     positive
## 15659               don        trust
## 15660        distraught     negative
## 15661        distraught      sadness
## 15662               don     positive
## 15663               don        trust
## 15664             start anticipation
## 15665             crazy        anger
## 15666             crazy         fear
## 15667             crazy     negative
## 15668             crazy      sadness
## 15669          advanced     positive
## 15670             sense     positive
## 15671             worth     positive
## 15672             waste      disgust
## 15673             waste     negative
## 15674              time anticipation
## 15675            afraid         fear
## 15676            afraid     negative
## 15677            actual     positive
## 15678           violent        anger
## 15679           violent      disgust
## 15680           violent         fear
## 15681           violent     negative
## 15682           violent     surprise
## 15683            stupid     negative
## 15684          humanity          joy
## 15685          humanity     positive
## 15686          humanity        trust
## 15687             major     positive
## 15688        government         fear
## 15689        government     negative
## 15690             waste      disgust
## 15691             waste     negative
## 15692         resources          joy
## 15693         resources     positive
## 15694         resources        trust
## 15695             tired     negative
## 15696              shit        anger
## 15697              shit      disgust
## 15698              shit     negative
## 15699              true          joy
## 15700              true     positive
## 15701              true        trust
## 15702            reason     positive
## 15703           hopeful anticipation
## 15704           hopeful          joy
## 15705           hopeful     positive
## 15706           hopeful     surprise
## 15707           hopeful        trust
## 15708              hail     negative
## 15709              hail     positive
## 15710              hail        trust
## 15711          continue anticipation
## 15712          continue     positive
## 15713          continue        trust
## 15714         depressed        anger
## 15715         depressed         fear
## 15716         depressed     negative
## 15717         depressed      sadness
## 15718      disappointed        anger
## 15719      disappointed      disgust
## 15720      disappointed     negative
## 15721      disappointed      sadness
## 15722         salvation anticipation
## 15723         salvation          joy
## 15724         salvation     positive
## 15725         salvation        trust
## 15726          mainstay     positive
## 15727          mainstay        trust
## 15728           improve anticipation
## 15729           improve          joy
## 15730           improve     positive
## 15731           improve        trust
## 15732            pretty anticipation
## 15733            pretty          joy
## 15734            pretty     positive
## 15735            pretty        trust
## 15736             cover        trust
## 15737               don     positive
## 15738               don        trust
## 15739       distraction     negative
## 15740            pretty anticipation
## 15741            pretty          joy
## 15742            pretty     positive
## 15743            pretty        trust
## 15744       ineffective     negative
## 15745           attempt anticipation
## 15746            amends     positive
## 15747            cherry     positive
## 15748              pick     positive
## 15749              hell        anger
## 15750              hell      disgust
## 15751              hell         fear
## 15752              hell     negative
## 15753              hell      sadness
## 15754              real     positive
## 15755              real        trust
## 15756            freely          joy
## 15757            freely     positive
## 15758            freely        trust
## 15759            giving     positive
## 15760            freely          joy
## 15761            freely     positive
## 15762            freely        trust
## 15763          increase     positive
## 15764         advantage     positive
## 15765       opportunity anticipation
## 15766       opportunity     positive
## 15767              real     positive
## 15768              real        trust
## 15769       possibility anticipation
## 15770           hostile        anger
## 15771           hostile      disgust
## 15772           hostile         fear
## 15773           hostile     negative
## 15774            coming anticipation
## 15775              shit        anger
## 15776              shit      disgust
## 15777              shit     negative
## 15778              hope anticipation
## 15779              hope          joy
## 15780              hope     positive
## 15781              hope     surprise
## 15782              hope        trust
## 15783               god anticipation
## 15784               god         fear
## 15785               god          joy
## 15786               god     positive
## 15787               god        trust
## 15788           feeling        anger
## 15789           feeling anticipation
## 15790           feeling      disgust
## 15791           feeling         fear
## 15792           feeling          joy
## 15793           feeling     negative
## 15794           feeling     positive
## 15795           feeling      sadness
## 15796           feeling     surprise
## 15797           feeling        trust
## 15798              real     positive
## 15799              real        trust
## 15800               bad        anger
## 15801               bad      disgust
## 15802               bad         fear
## 15803               bad     negative
## 15804               bad      sadness
## 15805          striking     positive
## 15806       unconscious     negative
## 15807              time anticipation
## 15808              deal anticipation
## 15809              deal          joy
## 15810              deal     positive
## 15811              deal     surprise
## 15812              deal        trust
## 15813            center     positive
## 15814            center        trust
## 15815              real     positive
## 15816              real        trust
## 15817           glimmer anticipation
## 15818           glimmer          joy
## 15819           glimmer     positive
## 15820           glimmer     surprise
## 15821              hope anticipation
## 15822              hope          joy
## 15823              hope     positive
## 15824              hope     surprise
## 15825              hope        trust
## 15826         suffering      disgust
## 15827         suffering         fear
## 15828         suffering     negative
## 15829         suffering      sadness
## 15830              ease     positive
## 15831        inequality        anger
## 15832        inequality         fear
## 15833        inequality     negative
## 15834        inequality      sadness
## 15835          superior     positive
## 15836            virtue     positive
## 15837            virtue        trust
## 15838          superior     positive
## 15839          inferior     negative
## 15840          inferior      sadness
## 15841             badly     negative
## 15842             badly      sadness
## 15843          inferior     negative
## 15844          inferior      sadness
## 15845              seal     positive
## 15846              seal        trust
## 15847      accidentally     surprise
## 15848          military         fear
## 15849             alien      disgust
## 15850             alien         fear
## 15851             alien     negative
## 15852         abduction         fear
## 15853         abduction     negative
## 15854         abduction      sadness
## 15855         abduction     surprise
## 15856         operation         fear
## 15857         operation        trust
## 15858           assured     positive
## 15859           assured        trust
## 15860              kill         fear
## 15861              kill     negative
## 15862              kill      sadness
## 15863           wasting      disgust
## 15864           wasting         fear
## 15865           wasting     negative
## 15866           wasting      sadness
## 15867              time anticipation
## 15868              grow anticipation
## 15869              grow          joy
## 15870              grow     positive
## 15871              grow        trust
## 15872             learn     positive
## 15873             build     positive
## 15874              time anticipation
## 15875              grow anticipation
## 15876              grow          joy
## 15877              grow     positive
## 15878              grow        trust
## 15879              food          joy
## 15880              food     positive
## 15881              food        trust
## 15882              shit        anger
## 15883              shit      disgust
## 15884              shit     negative
## 15885             money        anger
## 15886             money anticipation
## 15887             money          joy
## 15888             money     positive
## 15889             money     surprise
## 15890             money        trust
## 15891             money        anger
## 15892             money anticipation
## 15893             money          joy
## 15894             money     positive
## 15895             money     surprise
## 15896             money        trust
## 15897          peaceful anticipation
## 15898          peaceful          joy
## 15899          peaceful     positive
## 15900          peaceful     surprise
## 15901          peaceful        trust
## 15902            system        trust
## 15903             watch anticipation
## 15904             watch         fear
## 15905              fake     negative
## 15906             money        anger
## 15907             money anticipation
## 15908             money          joy
## 15909             money     positive
## 15910             money     surprise
## 15911             money        trust
## 15912           chicken         fear
## 15913             ghost         fear
## 15914             truth     positive
## 15915             truth        trust
## 15916          horrible        anger
## 15917          horrible      disgust
## 15918          horrible         fear
## 15919          horrible     negative
## 15920        experiment anticipation
## 15921        experiment     surprise
## 15922         confirmed     positive
## 15923         confirmed        trust
## 15924             lower     negative
## 15925             lower      sadness
## 15926         intellect     positive
## 15927              time anticipation
## 15928             study     positive
## 15929            proven        trust
## 15930          perceive     positive
## 15931          perceive        trust
## 15932           measure        trust
## 15933              real     positive
## 15934              real        trust
## 15935           physics     positive
## 15936              real     positive
## 15937              real        trust
## 15938           physics     positive
## 15939              clue anticipation
## 15940        technology     positive
## 15941          improved     positive
## 15942        production anticipation
## 15943        production     positive
## 15944        efficiency     positive
## 15945           benefit     positive
## 15946         ignorance     negative
## 15947              time anticipation
## 15948            infant anticipation
## 15949            infant         fear
## 15950            infant          joy
## 15951            infant     positive
## 15952            infant     surprise
## 15953         mortality        anger
## 15954         mortality         fear
## 15955         mortality     negative
## 15956         mortality      sadness
## 15957              food          joy
## 15958              food     positive
## 15959              food        trust
## 15960              real     positive
## 15961              real        trust
## 15962        expectancy anticipation
## 15963              risk anticipation
## 15964              risk         fear
## 15965              risk     negative
## 15966        starvation         fear
## 15967        starvation     negative
## 15968        starvation      sadness
## 15969             death        anger
## 15970             death anticipation
## 15971             death      disgust
## 15972             death         fear
## 15973             death     negative
## 15974             death      sadness
## 15975             death     surprise
## 15976       electricity     positive
## 15977              time anticipation
## 15978              time anticipation
## 15979             alive anticipation
## 15980             alive          joy
## 15981             alive     positive
## 15982             alive        trust
## 15983            income anticipation
## 15984            income          joy
## 15985            income     negative
## 15986            income     positive
## 15987            income      sadness
## 15988            income        trust
## 15989        inequality        anger
## 15990        inequality         fear
## 15991        inequality     negative
## 15992        inequality      sadness
## 15993            afford     positive
## 15994          absorbed     positive
## 15995              time anticipation
## 15996             alive anticipation
## 15997             alive          joy
## 15998             alive     positive
## 15999             alive        trust
## 16000             agree     positive
## 16001            change         fear
## 16002              hope anticipation
## 16003              hope          joy
## 16004              hope     positive
## 16005              hope     surprise
## 16006              hope        trust
## 16007             proof        trust
## 16008             focus     positive
## 16009          humanity          joy
## 16010          humanity     positive
## 16011          humanity        trust
## 16012         inflation         fear
## 16013         inflation     negative
## 16014             digit        trust
## 16015         inflation         fear
## 16016         inflation     negative
## 16017         inflation         fear
## 16018         inflation     negative
## 16019         hyperbole     negative
## 16020          politics        anger
## 16021        depression     negative
## 16022        depression      sadness
## 16023      unimaginable     negative
## 16024      unimaginable     positive
## 16025      unimaginable     surprise
## 16026             worse         fear
## 16027             worse     negative
## 16028             worse      sadness
## 16029           hopeful anticipation
## 16030           hopeful          joy
## 16031           hopeful     positive
## 16032           hopeful     surprise
## 16033           hopeful        trust
## 16034             focus     positive
## 16035        technology     positive
## 16036       advancement     positive
## 16037           wishful anticipation
## 16038            stupid     negative
## 16039               gun        anger
## 16040               gun         fear
## 16041               gun     negative
## 16042              brag     negative
## 16043             child anticipation
## 16044             child          joy
## 16045             child     positive
## 16046               gun        anger
## 16047               gun         fear
## 16048               gun     negative
## 16049     irresponsible     negative
## 16050               gun        anger
## 16051               gun         fear
## 16052               gun     negative
## 16053            fellow     positive
## 16054            fellow        trust
## 16055            bombed      disgust
## 16056            bombed     negative
## 16057          innocent     positive
## 16058          innocent        trust
## 16059              land     positive
## 16060               don     positive
## 16061               don        trust
## 16062            greedy      disgust
## 16063            greedy     negative
## 16064             child anticipation
## 16065             child          joy
## 16066             child     positive
## 16067               don     positive
## 16068               don        trust
## 16069           prosper anticipation
## 16070           prosper          joy
## 16071           prosper     positive
## 16072            greedy      disgust
## 16073            greedy     negative
## 16074          absorbed     positive
## 16075          arrogant        anger
## 16076          arrogant      disgust
## 16077          arrogant     negative
## 16078         dangerous         fear
## 16079         dangerous     negative
## 16080               war         fear
## 16081               war     negative
## 16082             peace anticipation
## 16083             peace          joy
## 16084             peace     positive
## 16085             peace        trust
## 16086           empathy     positive
## 16087               don     positive
## 16088               don        trust
## 16089          struggle        anger
## 16090          struggle         fear
## 16091          struggle     negative
## 16092          struggle      sadness
## 16093               lie        anger
## 16094               lie      disgust
## 16095               lie     negative
## 16096               lie      sadness
## 16097          unstable         fear
## 16098          unstable     negative
## 16099          unstable     surprise
## 16100        irrational      disgust
## 16101        irrational         fear
## 16102        irrational     negative
## 16103          immature anticipation
## 16104          immature     negative
## 16105             child anticipation
## 16106             child          joy
## 16107             child     positive
## 16108               gun        anger
## 16109               gun         fear
## 16110               gun     negative
## 16111           hopeful anticipation
## 16112           hopeful          joy
## 16113           hopeful     positive
## 16114           hopeful     surprise
## 16115           hopeful        trust
## 16116      intelligence         fear
## 16117      intelligence          joy
## 16118      intelligence     positive
## 16119      intelligence        trust
## 16120          shooting        anger
## 16121          shooting         fear
## 16122          shooting     negative
## 16123              grow anticipation
## 16124              grow          joy
## 16125              grow     positive
## 16126              grow        trust
## 16127           wishful anticipation
## 16128          advanced     positive
## 16129           forward     positive
## 16130         backwards      disgust
## 16131         backwards     negative
## 16132              true          joy
## 16133              true     positive
## 16134              true        trust
## 16135              true          joy
## 16136              true     positive
## 16137              true        trust
## 16138          learning     positive
## 16139              real     positive
## 16140              real        trust
## 16141          relative        trust
## 16142              ease     positive
## 16143              shit        anger
## 16144              shit      disgust
## 16145              shit     negative
## 16146              cool     positive
## 16147          religion        trust
## 16148           secular anticipation
## 16149         existence     positive
## 16150            enrich     positive
## 16151          majority          joy
## 16152          majority     positive
## 16153          majority        trust
## 16154           ability     positive
## 16155            change         fear
## 16156          humanity          joy
## 16157          humanity     positive
## 16158          humanity        trust
## 16159           ability     positive
## 16160             offer     positive
## 16161              real     positive
## 16162              real        trust
## 16163         confirmed     positive
## 16164         confirmed        trust
## 16165           physics     positive
## 16166            system        trust
## 16167         dignified     positive
## 16168             bleak     negative
## 16169             bleak      sadness
## 16170            refuse     negative
## 16171            escape anticipation
## 16172            escape         fear
## 16173            escape     negative
## 16174            escape     positive
## 16175             avoid         fear
## 16176             avoid     negative
## 16177            happen anticipation
## 16178         resources          joy
## 16179         resources     positive
## 16180         resources        trust
## 16181               war         fear
## 16182               war     negative
## 16183               war         fear
## 16184               war     negative
## 16185          terrible        anger
## 16186          terrible      disgust
## 16187          terrible         fear
## 16188          terrible     negative
## 16189          terrible      sadness
## 16190         strategic     positive
## 16191            deadly        anger
## 16192            deadly      disgust
## 16193            deadly         fear
## 16194            deadly     negative
## 16195            deadly      sadness
## 16196         resources          joy
## 16197         resources     positive
## 16198         resources        trust
## 16199            happen anticipation
## 16200             lines         fear
## 16201           excited anticipation
## 16202           excited          joy
## 16203           excited     positive
## 16204           excited     surprise
## 16205           excited        trust
## 16206         surprised     surprise
## 16207             tired     negative
## 16208            giving     positive
## 16209              deal anticipation
## 16210              deal          joy
## 16211              deal     positive
## 16212              deal     surprise
## 16213              deal        trust
## 16214          worrying anticipation
## 16215          worrying         fear
## 16216          worrying     negative
## 16217          worrying      sadness
## 16218            chance     surprise
## 16219        population     positive
## 16220             alive anticipation
## 16221             alive          joy
## 16222             alive     positive
## 16223             alive        trust
## 16224              fake     negative
## 16225             trump     surprise
## 16226               god anticipation
## 16227               god         fear
## 16228               god          joy
## 16229               god     positive
## 16230               god        trust
## 16231            chosen     positive
## 16232             alien      disgust
## 16233             alien         fear
## 16234             alien     negative
## 16235          fighting        anger
## 16236          fighting     negative
## 16237               bad        anger
## 16238               bad      disgust
## 16239               bad         fear
## 16240               bad     negative
## 16241               bad      sadness
## 16242              damn        anger
## 16243              damn      disgust
## 16244              damn     negative
## 16245               don     positive
## 16246               don        trust
## 16247            worthy     positive
## 16248            worthy        trust
## 16249             worse         fear
## 16250             worse     negative
## 16251             worse      sadness
## 16252              time anticipation
## 16253         inflation         fear
## 16254         inflation     negative
## 16255         recession        anger
## 16256         recession      disgust
## 16257         recession         fear
## 16258         recession     negative
## 16259         recession      sadness
## 16260             worse         fear
## 16261             worse     negative
## 16262             worse      sadness
## 16263         impending anticipation
## 16264         impending         fear
## 16265              doom         fear
## 16266              doom     negative
## 16267            coming anticipation
## 16268              shit        anger
## 16269              shit      disgust
## 16270              shit     negative
## 16271            refuse     negative
## 16272              crap      disgust
## 16273              crap     negative
## 16274             watch anticipation
## 16275             watch         fear
## 16276               bad        anger
## 16277               bad      disgust
## 16278               bad         fear
## 16279               bad     negative
## 16280               bad      sadness
## 16281             worse         fear
## 16282             worse     negative
## 16283             worse      sadness
## 16284              true          joy
## 16285              true     positive
## 16286              true        trust
## 16287           physics     positive
## 16288              time anticipation
## 16289          advanced     positive
## 16290       retaliation        anger
## 16291       retaliation         fear
## 16292       retaliation     negative
## 16293              save          joy
## 16294              save     positive
## 16295              save        trust
## 16296             error     negative
## 16297             error      sadness
## 16298     insignificant        anger
## 16299     insignificant     negative
## 16300     insignificant      sadness
## 16301          inferior     negative
## 16302          inferior      sadness
## 16303             slave        anger
## 16304             slave         fear
## 16305             slave     negative
## 16306             slave      sadness
## 16307           falling     negative
## 16308           falling      sadness
## 16309             faith anticipation
## 16310             faith          joy
## 16311             faith     positive
## 16312             faith        trust
## 16313          humanity          joy
## 16314          humanity     positive
## 16315          humanity        trust
## 16316      intervention     negative
## 16317      intervention     positive
## 16318      intervention      sadness
## 16319            stupid     negative
## 16320            greedy      disgust
## 16321            greedy     negative
## 16322              late     negative
## 16323              late      sadness
## 16324               bad        anger
## 16325               bad      disgust
## 16326               bad         fear
## 16327               bad     negative
## 16328               bad      sadness
## 16329             death        anger
## 16330             death anticipation
## 16331             death      disgust
## 16332             death         fear
## 16333             death     negative
## 16334             death      sadness
## 16335             death     surprise
## 16336             worse         fear
## 16337             worse     negative
## 16338             worse      sadness
## 16339               war         fear
## 16340               war     negative
## 16341         holocaust        anger
## 16342         holocaust      disgust
## 16343         holocaust         fear
## 16344         holocaust     negative
## 16345         holocaust      sadness
## 16346             worse         fear
## 16347             worse     negative
## 16348             worse      sadness
## 16349            famine     negative
## 16350            famine      sadness
## 16351           disease        anger
## 16352           disease      disgust
## 16353           disease         fear
## 16354           disease     negative
## 16355           disease      sadness
## 16356            happen anticipation
## 16357        population     positive
## 16358           forward     positive
## 16359             worse         fear
## 16360             worse     negative
## 16361             worse      sadness
## 16362          complain        anger
## 16363          complain     negative
## 16364          complain      sadness
## 16365              food          joy
## 16366              food     positive
## 16367              food        trust
## 16368             store anticipation
## 16369             store     positive
## 16370              grow anticipation
## 16371              grow          joy
## 16372              grow     positive
## 16373              grow        trust
## 16374            reason     positive
## 16375           forward     positive
## 16376           finally anticipation
## 16377           finally      disgust
## 16378           finally          joy
## 16379           finally     positive
## 16380           finally     surprise
## 16381           finally        trust
## 16382              kill         fear
## 16383              kill     negative
## 16384              kill      sadness
## 16385               bad        anger
## 16386               bad      disgust
## 16387               bad         fear
## 16388               bad     negative
## 16389               bad      sadness
## 16390            plague      disgust
## 16391            plague         fear
## 16392            plague     negative
## 16393            plague      sadness
## 16394             death        anger
## 16395             death anticipation
## 16396             death      disgust
## 16397             death         fear
## 16398             death     negative
## 16399             death      sadness
## 16400             death     surprise
## 16401          humanity          joy
## 16402          humanity     positive
## 16403          humanity        trust
## 16404           survive     positive
## 16405           survive     positive
## 16406             worse         fear
## 16407             worse     negative
## 16408             worse      sadness
## 16409             weird      disgust
## 16410             weird     negative
## 16411              time anticipation
## 16412             alive anticipation
## 16413             alive          joy
## 16414             alive     positive
## 16415             alive        trust
## 16416            change         fear
## 16417             peace anticipation
## 16418             peace          joy
## 16419             peace     positive
## 16420             peace        trust
## 16421        scientific     positive
## 16422        scientific        trust
## 16423           medical anticipation
## 16424           medical         fear
## 16425           medical     positive
## 16426           medical        trust
## 16427            change         fear
## 16428           improve anticipation
## 16429           improve          joy
## 16430           improve     positive
## 16431           improve        trust
## 16432           poverty        anger
## 16433           poverty      disgust
## 16434           poverty         fear
## 16435           poverty     negative
## 16436           poverty      sadness
## 16437              food          joy
## 16438              food     positive
## 16439              food        trust
## 16440            wealth          joy
## 16441            wealth     positive
## 16442            wealth        trust
## 16443        inequality        anger
## 16444        inequality         fear
## 16445        inequality     negative
## 16446        inequality      sadness
## 16447            pretty anticipation
## 16448            pretty          joy
## 16449            pretty     positive
## 16450            pretty        trust
## 16451            change         fear
## 16452             alien      disgust
## 16453             alien         fear
## 16454             alien     negative
## 16455            coming anticipation
## 16456              save          joy
## 16457              save     positive
## 16458              save        trust
## 16459            pretty anticipation
## 16460            pretty          joy
## 16461            pretty     positive
## 16462            pretty        trust
## 16463            lowest     negative
## 16464            lowest      sadness
## 16465        expectancy anticipation
## 16466              doom         fear
## 16467              doom     negative
## 16468             gloom     negative
## 16469             gloom      sadness
## 16470             ready anticipation
## 16471              save          joy
## 16472              save     positive
## 16473              save        trust
## 16474              dumb     negative
## 16475               god anticipation
## 16476               god         fear
## 16477               god          joy
## 16478               god     positive
## 16479               god        trust
## 16480            chance     surprise
## 16481              kick        anger
## 16482              kick     negative
## 16483               ass     negative
## 16484              gear     positive
## 16485               pay anticipation
## 16486               pay          joy
## 16487               pay     positive
## 16488               pay        trust
## 16489         attention     positive
## 16490          question     positive
## 16491       intelligent     positive
## 16492       intelligent        trust
## 16493             alien      disgust
## 16494             alien         fear
## 16495             alien     negative
## 16496             worth     positive
## 16497               fun anticipation
## 16498               fun          joy
## 16499               fun     positive
## 16500         worthless        anger
## 16501         worthless      disgust
## 16502         worthless     negative
## 16503         worthless      sadness
## 16504             alien      disgust
## 16505             alien         fear
## 16506             alien     negative
## 16507             worth     positive
## 16508              food          joy
## 16509              food     positive
## 16510              food        trust
## 16511           shelter     positive
## 16512           shelter        trust
## 16513              cool     positive
## 16514       incompetent        anger
## 16515       incompetent     negative
## 16516       incompetent      sadness
## 16517              hope anticipation
## 16518              hope          joy
## 16519              hope     positive
## 16520              hope     surprise
## 16521              hope        trust
## 16522          humanity          joy
## 16523          humanity     positive
## 16524          humanity        trust
## 16525              pray anticipation
## 16526              pray         fear
## 16527              pray          joy
## 16528              pray     positive
## 16529              pray     surprise
## 16530              pray        trust
## 16531            perish         fear
## 16532            perish     negative
## 16533            perish      sadness
## 16534               bad        anger
## 16535               bad      disgust
## 16536               bad         fear
## 16537               bad     negative
## 16538               bad      sadness
## 16539            stupid     negative
## 16540          religion        trust
## 16541          helpless         fear
## 16542          helpless     negative
## 16543          helpless      sadness
## 16544       overwhelmed     negative
## 16545       overwhelmed      sadness
## 16546             dread anticipation
## 16547             dread         fear
## 16548             dread     negative
## 16549            refuse     negative
## 16550         influenza     negative
## 16551          absolute     positive
## 16552             crack     negative
## 16553         including     positive
## 16554             worse         fear
## 16555             worse     negative
## 16556             worse      sadness
## 16557       experienced     positive
## 16558       experienced        trust
## 16559        government         fear
## 16560        government     negative
## 16561        oppressive        anger
## 16562        oppressive      disgust
## 16563        oppressive         fear
## 16564        oppressive     negative
## 16565        oppressive      sadness
## 16566          imprison     negative
## 16567         addiction     negative
## 16568        completely     positive
## 16569            wealth          joy
## 16570            wealth     positive
## 16571            wealth        trust
## 16572             lower     negative
## 16573             lower      sadness
## 16574           renewal     positive
## 16575        revolution        anger
## 16576        revolution anticipation
## 16577        revolution         fear
## 16578        revolution     negative
## 16579        revolution     positive
## 16580        revolution      sadness
## 16581        revolution     surprise
## 16582             child anticipation
## 16583             child          joy
## 16584             child     positive
## 16585           slavery        anger
## 16586           slavery      disgust
## 16587           slavery         fear
## 16588           slavery     negative
## 16589           slavery      sadness
## 16590            sudden     surprise
## 16591         pollution      disgust
## 16592         pollution     negative
## 16593        remarkable          joy
## 16594        remarkable     positive
## 16595        remarkable     surprise
## 16596        remarkable        trust
## 16597            degree     positive
## 16598             civil     positive
## 16599               war         fear
## 16600               war     negative
## 16601           medical anticipation
## 16602           medical         fear
## 16603           medical     positive
## 16604           medical        trust
## 16605               don     positive
## 16606               don        trust
## 16607           advance anticipation
## 16608           advance         fear
## 16609           advance          joy
## 16610           advance     positive
## 16611           advance     surprise
## 16612         evolution     positive
## 16613            demise         fear
## 16614            demise     negative
## 16615            demise      sadness
## 16616          humanity          joy
## 16617          humanity     positive
## 16618          humanity        trust
## 16619        remarkable          joy
## 16620        remarkable     positive
## 16621        remarkable     surprise
## 16622        remarkable        trust
## 16623       progression anticipation
## 16624       progression          joy
## 16625       progression     positive
## 16626       progression      sadness
## 16627       progression        trust
## 16628              dark      sadness
## 16629        scientific     positive
## 16630        scientific        trust
## 16631       achievement anticipation
## 16632       achievement          joy
## 16633       achievement     positive
## 16634       achievement        trust
## 16635          cohesion        trust
## 16636     consciousness     positive
## 16637          humanity          joy
## 16638          humanity     positive
## 16639          humanity        trust
## 16640           survive     positive
## 16641          humanity          joy
## 16642          humanity     positive
## 16643          humanity        trust
## 16644         resources          joy
## 16645         resources     positive
## 16646         resources        trust
## 16647        population     positive
## 16648          terrible        anger
## 16649          terrible      disgust
## 16650          terrible         fear
## 16651          terrible     negative
## 16652          terrible      sadness
## 16653     understanding     positive
## 16654     understanding        trust
## 16655          planning anticipation
## 16656          planning     positive
## 16657          planning        trust
## 16658        management     positive
## 16659        management        trust
## 16660             waste      disgust
## 16661             waste     negative
## 16662         resources          joy
## 16663         resources     positive
## 16664         resources        trust
## 16665         pollution      disgust
## 16666         pollution     negative
## 16667            action     positive
## 16668             learn     positive
## 16669            afraid         fear
## 16670            afraid     negative
## 16671        completely     positive
## 16672       meaningless     negative
## 16673       meaningless      sadness
## 16674               god anticipation
## 16675               god         fear
## 16676               god          joy
## 16677               god     positive
## 16678               god        trust
## 16679               don     positive
## 16680               don        trust
## 16681            happen anticipation
## 16682            reason     positive
## 16683          military         fear
## 16684          sentence        anger
## 16685          sentence anticipation
## 16686          sentence      disgust
## 16687          sentence         fear
## 16688          sentence     negative
## 16689          sentence      sadness
## 16690           feeling        anger
## 16691           feeling anticipation
## 16692           feeling      disgust
## 16693           feeling         fear
## 16694           feeling          joy
## 16695           feeling     negative
## 16696           feeling     positive
## 16697           feeling      sadness
## 16698           feeling     surprise
## 16699           feeling        trust
## 16700             alien      disgust
## 16701             alien         fear
## 16702             alien     negative
## 16703             faith anticipation
## 16704             faith          joy
## 16705             faith     positive
## 16706             faith        trust
## 16707     consciousness     positive
## 16708     consciousness     positive
## 16709           physics     positive
## 16710           ancient     negative
## 16711              talk     positive
## 16712               god anticipation
## 16713               god         fear
## 16714               god          joy
## 16715               god     positive
## 16716               god        trust
## 16717             flesh      disgust
## 16718               don     positive
## 16719               don        trust
## 16720           knowing     positive
## 16721               god anticipation
## 16722               god         fear
## 16723               god          joy
## 16724               god     positive
## 16725               god        trust
## 16726           ancient     negative
## 16727           ancient     negative
## 16728            wicked         fear
## 16729            wicked     negative
## 16730             leave     negative
## 16731             leave      sadness
## 16732             leave     surprise
## 16733           promise          joy
## 16734           promise     positive
## 16735           promise        trust
## 16736          religion        trust
## 16737               god anticipation
## 16738               god         fear
## 16739               god          joy
## 16740               god     positive
## 16741               god        trust
## 16742             worse         fear
## 16743             worse     negative
## 16744             worse      sadness
## 16745         degrading      disgust
## 16746         degrading         fear
## 16747         degrading     negative
## 16748         degrading      sadness
## 16749         evolution     positive
## 16750        destroying        anger
## 16751        destroying         fear
## 16752        destroying     negative
## 16753        destroying      sadness
## 16754           habitat     positive
## 16755           primary     positive
## 16756        scientific     positive
## 16757        scientific        trust
## 16758     understanding     positive
## 16759     understanding        trust
## 16760      announcement anticipation
## 16761          humanity          joy
## 16762          humanity     positive
## 16763          humanity        trust
## 16764              true          joy
## 16765              true     positive
## 16766              true        trust
## 16767              hope anticipation
## 16768              hope          joy
## 16769              hope     positive
## 16770              hope     surprise
## 16771              hope        trust
## 16772          religion        trust
## 16773              crap      disgust
## 16774              crap     negative
## 16775              fell     negative
## 16776              fell      sadness
## 16777              hell        anger
## 16778              hell      disgust
## 16779              hell         fear
## 16780              hell     negative
## 16781              hell      sadness
## 16782         pollution      disgust
## 16783         pollution     negative
## 16784           ancient     negative
## 16785             alien      disgust
## 16786             alien         fear
## 16787             alien     negative
## 16788             truth     positive
## 16789             truth        trust
## 16790           careful     positive
## 16791              join     positive
## 16792              gate        trust
## 16793              cult         fear
## 16794              cult     negative
## 16795           suicide        anger
## 16796           suicide         fear
## 16797           suicide     negative
## 16798           suicide      sadness
## 16799          evacuate         fear
## 16800          evacuate     negative
## 16801              hale     positive
## 16802               don     positive
## 16803               don        trust
## 16804             tired     negative
## 16805           wasting      disgust
## 16806           wasting         fear
## 16807           wasting     negative
## 16808           wasting      sadness
## 16809              time anticipation
## 16810             idiot      disgust
## 16811             idiot     negative
## 16812            change         fear
## 16813             greed        anger
## 16814             greed      disgust
## 16815             greed     negative
## 16816               tax     negative
## 16817               tax      sadness
## 16818             money        anger
## 16819             money anticipation
## 16820             money          joy
## 16821             money     positive
## 16822             money     surprise
## 16823             money        trust
## 16824              time anticipation
## 16825             money        anger
## 16826             money anticipation
## 16827             money          joy
## 16828             money     positive
## 16829             money     surprise
## 16830             money        trust
## 16831        betterment     positive
## 16832          humanity          joy
## 16833          humanity     positive
## 16834          humanity        trust
## 16835           wasting      disgust
## 16836           wasting         fear
## 16837           wasting     negative
## 16838           wasting      sadness
## 16839              time anticipation
## 16840             money        anger
## 16841             money anticipation
## 16842             money          joy
## 16843             money     positive
## 16844             money     surprise
## 16845             money        trust
## 16846            income anticipation
## 16847            income          joy
## 16848            income     negative
## 16849            income     positive
## 16850            income      sadness
## 16851            income        trust
## 16852             cheap     negative
## 16853           useless     negative
## 16854        government         fear
## 16855        government     negative
## 16856          personal        trust
## 16857           minimum     negative
## 16858         president     positive
## 16859         president        trust
## 16860              fame     positive
## 16861          humanity          joy
## 16862          humanity     positive
## 16863          humanity        trust
## 16864             wrong     negative
## 16865            actual     positive
## 16866             share anticipation
## 16867             share          joy
## 16868             share     positive
## 16869             share        trust
## 16870              hope anticipation
## 16871              hope          joy
## 16872              hope     positive
## 16873              hope     surprise
## 16874              hope        trust
## 16875       deleterious        anger
## 16876       deleterious      disgust
## 16877       deleterious         fear
## 16878       deleterious     negative
## 16879         promising     positive
## 16880       responsible     positive
## 16881       responsible        trust
## 16882           outcome     positive
## 16883              true          joy
## 16884              true     positive
## 16885              true        trust
## 16886              true          joy
## 16887              true     positive
## 16888              true        trust
## 16889       information     positive
## 16890            happen anticipation
## 16891             alien      disgust
## 16892             alien         fear
## 16893             alien     negative
## 16894          presence     positive
## 16895        technology     positive
## 16896            happen anticipation
## 16897           hearing         fear
## 16898           hearing     negative
## 16899             elite anticipation
## 16900             elite          joy
## 16901             elite     positive
## 16902             elite        trust
## 16903             leave     negative
## 16904             leave      sadness
## 16905             leave     surprise
## 16906              lead     positive
## 16907        population     positive
## 16908         existence     positive
## 16909             elite anticipation
## 16910             elite          joy
## 16911             elite     positive
## 16912             elite        trust
## 16913            forced         fear
## 16914            forced     negative
## 16915               die         fear
## 16916               die     negative
## 16917               die      sadness
## 16918           blessed          joy
## 16919           blessed     positive
## 16920              rest     positive
## 16921           selfish        anger
## 16922           selfish      disgust
## 16923           selfish     negative
## 16924              gain anticipation
## 16925              gain          joy
## 16926              gain     positive
## 16927           survive     positive
## 16928              time anticipation
## 16929         believing     positive
## 16930         believing        trust
## 16931             greed        anger
## 16932             greed      disgust
## 16933             greed     negative
## 16934              lead     positive
## 16935              time anticipation
## 16936             doubt         fear
## 16937             doubt     negative
## 16938             doubt      sadness
## 16939             doubt        trust
## 16940            change         fear
## 16941              baby          joy
## 16942              baby     positive
## 16943              real     positive
## 16944              real        trust
## 16945           ancient     negative
## 16946           witness        trust
## 16947       conflicting     negative
## 16948            expect anticipation
## 16949            expect     positive
## 16950            expect     surprise
## 16951            expect        trust
## 16952            change         fear
## 16953              hope anticipation
## 16954              hope          joy
## 16955              hope     positive
## 16956              hope     surprise
## 16957              hope        trust
## 16958             worse         fear
## 16959             worse     negative
## 16960             worse      sadness
## 16961               bad        anger
## 16962               bad      disgust
## 16963               bad         fear
## 16964               bad     negative
## 16965               bad      sadness
## 16966        technology     positive
## 16967             track anticipation
## 16968              real     positive
## 16969              real        trust
## 16970              hope anticipation
## 16971              hope          joy
## 16972              hope     positive
## 16973              hope     surprise
## 16974              hope        trust
## 16975              real     positive
## 16976              real        trust
## 16977              true          joy
## 16978              true     positive
## 16979              true        trust
## 16980             alien      disgust
## 16981             alien         fear
## 16982             alien     negative
## 16983            flying         fear
## 16984            flying     positive
## 16985          religion        trust
## 16986               lie        anger
## 16987               lie      disgust
## 16988               lie     negative
## 16989               lie      sadness
## 16990             chaos        anger
## 16991             chaos         fear
## 16992             chaos     negative
## 16993             chaos      sadness
## 16994          collapse      disgust
## 16995          collapse         fear
## 16996          collapse     negative
## 16997          collapse      sadness
## 16998              time anticipation
## 16999              fear        anger
## 17000              fear         fear
## 17001              fear     negative
## 17002            change         fear
## 17003              save          joy
## 17004              save     positive
## 17005              save        trust
## 17006            flying         fear
## 17007            flying     positive
## 17008              wont anticipation
## 17009            govern     positive
## 17010            govern        trust
## 17011             start anticipation
## 17012               war         fear
## 17013               war     negative
## 17014             avoid         fear
## 17015             avoid     negative
## 17016            giving     positive
## 17017              sick      disgust
## 17018              sick     negative
## 17019              sick      sadness
## 17020      mathematical        trust
## 17021             haven     positive
## 17022             haven        trust
## 17023             radio     positive
## 17024            system        trust
## 17025         traveling     positive
## 17026              star anticipation
## 17027              star          joy
## 17028              star     positive
## 17029              star        trust
## 17030             watch anticipation
## 17031             watch         fear
## 17032               don     positive
## 17033               don        trust
## 17034              slip     negative
## 17035              slip     surprise
## 17036               don     positive
## 17037               don        trust
## 17038              slip     negative
## 17039              slip     surprise
## 17040               sky     positive
## 17041              aura     positive
## 17042               sun anticipation
## 17043               sun          joy
## 17044               sun     positive
## 17045               sun     surprise
## 17046               sun        trust
## 17047           shining anticipation
## 17048           shining          joy
## 17049           shining     positive
## 17050               sky     positive
## 17051              beam          joy
## 17052              beam     positive
## 17053            brains     positive
## 17054             share anticipation
## 17055             share          joy
## 17056             share     positive
## 17057             share        trust
## 17058              land     positive
## 17059             worse         fear
## 17060             worse     negative
## 17061             worse      sadness
## 17062            action     positive
## 17063             alien      disgust
## 17064             alien         fear
## 17065             alien     negative
## 17066           knowing     positive
## 17067             worse         fear
## 17068             worse     negative
## 17069             worse      sadness
## 17070           finally anticipation
## 17071           finally      disgust
## 17072           finally          joy
## 17073           finally     positive
## 17074           finally     surprise
## 17075           finally        trust
## 17076             toxin         fear
## 17077             toxin     negative
## 17078           extinct     negative
## 17079           extinct      sadness
## 17080            lovely anticipation
## 17081            lovely          joy
## 17082            lovely     positive
## 17083            lovely      sadness
## 17084            lovely     surprise
## 17085            lovely        trust
## 17086               god anticipation
## 17087               god         fear
## 17088               god          joy
## 17089               god     positive
## 17090               god        trust
## 17091             alien      disgust
## 17092             alien         fear
## 17093             alien     negative
## 17094              lead     positive
## 17095              true          joy
## 17096              true     positive
## 17097              true        trust
## 17098            scream        anger
## 17099            scream      disgust
## 17100            scream         fear
## 17101            scream     negative
## 17102            scream     surprise
## 17103          humanity          joy
## 17104          humanity     positive
## 17105          humanity        trust
## 17106             ready anticipation
## 17107        government         fear
## 17108        government     negative
## 17109        government         fear
## 17110        government     negative
## 17111              real     positive
## 17112              real        trust
## 17113            excuse     negative
## 17114          increase     positive
## 17115          military         fear
## 17116              fear        anger
## 17117              fear         fear
## 17118              fear     negative
## 17119            actual     positive
## 17120              fear        anger
## 17121              fear         fear
## 17122              fear     negative
## 17123              hope anticipation
## 17124              hope          joy
## 17125              hope     positive
## 17126              hope     surprise
## 17127              hope        trust
## 17128             burnt      disgust
## 17129             burnt     negative
## 17130           feeling        anger
## 17131           feeling anticipation
## 17132           feeling      disgust
## 17133           feeling         fear
## 17134           feeling          joy
## 17135           feeling     negative
## 17136           feeling     positive
## 17137           feeling      sadness
## 17138           feeling     surprise
## 17139           feeling        trust
## 17140         destroyed        anger
## 17141         destroyed         fear
## 17142         destroyed     negative
## 17143         destroyed      sadness
## 17144            wealth          joy
## 17145            wealth     positive
## 17146            wealth        trust
## 17147        inequality        anger
## 17148        inequality         fear
## 17149        inequality     negative
## 17150        inequality      sadness
## 17151               top anticipation
## 17152               top     positive
## 17153               top        trust
## 17154             wages          joy
## 17155             wages     positive
## 17156           screwed        anger
## 17157           screwed     negative
## 17158             depth     positive
## 17159             depth        trust
## 17160        depression     negative
## 17161        depression      sadness
## 17162              mess      disgust
## 17163              mess     negative
## 17164            wealth          joy
## 17165            wealth     positive
## 17166            wealth        trust
## 17167        inequality        anger
## 17168        inequality         fear
## 17169        inequality     negative
## 17170        inequality      sadness
## 17171        destroying        anger
## 17172        destroying         fear
## 17173        destroying     negative
## 17174        destroying      sadness
## 17175           wishful anticipation
## 17176             alien      disgust
## 17177             alien         fear
## 17178             alien     negative
## 17179        technology     positive
## 17180       seriousness         fear
## 17181       seriousness      sadness
## 17182            effort     positive
## 17183             unity     positive
## 17184             unity        trust
## 17185              lack     negative
## 17186     determination     positive
## 17187     determination        trust
## 17188           wishful anticipation
## 17189          cautious anticipation
## 17190          cautious         fear
## 17191          cautious     positive
## 17192          cautious        trust
## 17193           wishful anticipation
## 17194              lead     positive
## 17195           subject     negative
## 17196             waste      disgust
## 17197             waste     negative
## 17198              time anticipation
## 17199        technology     positive
## 17200             build     positive
## 17201           measure        trust
## 17202            pretty anticipation
## 17203            pretty          joy
## 17204            pretty     positive
## 17205            pretty        trust
## 17206             alien      disgust
## 17207             alien         fear
## 17208             alien     negative
## 17209            chance     surprise
## 17210          favorite          joy
## 17211          favorite     positive
## 17212          favorite        trust
## 17213            series        trust
## 17214              hell        anger
## 17215              hell      disgust
## 17216              hell         fear
## 17217              hell     negative
## 17218              hell      sadness
## 17219               lie        anger
## 17220               lie      disgust
## 17221               lie     negative
## 17222               lie      sadness
## 17223               don     positive
## 17224               don        trust
## 17225              doom         fear
## 17226              doom     negative
## 17227              time anticipation
## 17228             alive anticipation
## 17229             alive          joy
## 17230             alive     positive
## 17231             alive        trust
## 17232         improving     positive
## 17233           poverty        anger
## 17234           poverty      disgust
## 17235           poverty         fear
## 17236           poverty     negative
## 17237           poverty      sadness
## 17238              food          joy
## 17239              food     positive
## 17240              food        trust
## 17241          scarcity        anger
## 17242          scarcity         fear
## 17243          scarcity     negative
## 17244          scarcity      sadness
## 17245          delusion        anger
## 17246          delusion         fear
## 17247          delusion     negative
## 17248          delusion      sadness
## 17249            ignore     negative
## 17250         objective anticipation
## 17251         objective     positive
## 17252         objective        trust
## 17253          learning     positive
## 17254        marketable     positive
## 17255            lawyer        anger
## 17256            lawyer      disgust
## 17257            lawyer         fear
## 17258            lawyer     negative
## 17259            doctor     positive
## 17260            doctor        trust
## 17261              food          joy
## 17262              food     positive
## 17263              food        trust
## 17264       approaching anticipation
## 17265           knowing     positive
## 17266              real     positive
## 17267              real        trust
## 17268              true          joy
## 17269              true     positive
## 17270              true        trust
## 17271         poisoning      disgust
## 17272         poisoning     negative
## 17273              save          joy
## 17274              save     positive
## 17275              save        trust
## 17276          congress      disgust
## 17277          congress        trust
## 17278           hearing         fear
## 17279           hearing     negative
## 17280           harvest anticipation
## 17281           harvest          joy
## 17282           harvest     positive
## 17283             watch anticipation
## 17284             watch         fear
## 17285             serve     negative
## 17286             serve        trust
## 17287              real     positive
## 17288              real        trust
## 17289           reading     positive
## 17290            pretty anticipation
## 17291            pretty          joy
## 17292            pretty     positive
## 17293            pretty        trust
## 17294              true          joy
## 17295              true     positive
## 17296              true        trust
## 17297        propaganda     negative
## 17298             panic         fear
## 17299             panic     negative
## 17300        propaganda     negative
## 17301            effort     positive
## 17302            demand        anger
## 17303            demand     negative
## 17304         resources          joy
## 17305         resources     positive
## 17306         resources        trust
## 17307            pretty anticipation
## 17308            pretty          joy
## 17309            pretty     positive
## 17310            pretty        trust
## 17311           chicken         fear
## 17312               don     positive
## 17313               don        trust
## 17314               gun        anger
## 17315               gun         fear
## 17316               gun     negative
## 17317               war         fear
## 17318               war     negative
## 17319             start anticipation
## 17320        compliance     positive
## 17321        compliance        trust
## 17322               bad        anger
## 17323               bad      disgust
## 17324               bad         fear
## 17325               bad     negative
## 17326               bad      sadness
## 17327             lower     negative
## 17328             lower      sadness
## 17329           ability     positive
## 17330            attack        anger
## 17331            attack         fear
## 17332            attack     negative
## 17333               don     positive
## 17334               don        trust
## 17335        ridiculous        anger
## 17336        ridiculous      disgust
## 17337        ridiculous     negative
## 17338              love          joy
## 17339              love     positive
## 17340              shit        anger
## 17341              shit      disgust
## 17342              shit     negative
## 17343             angry        anger
## 17344             angry      disgust
## 17345             angry     negative
## 17346              kill         fear
## 17347              kill     negative
## 17348              kill      sadness
## 17349              late     negative
## 17350              late      sadness
## 17351               don     positive
## 17352               don        trust
## 17353             scare        anger
## 17354             scare anticipation
## 17355             scare         fear
## 17356             scare     negative
## 17357             scare     surprise
## 17358        government         fear
## 17359        government     negative
## 17360             fixed        trust
## 17361         desperate     negative
## 17362              damn        anger
## 17363              damn      disgust
## 17364              damn     negative
## 17365            ground        trust
## 17366          frighten         fear
## 17367          frighten     negative
## 17368          frighten      sadness
## 17369          frighten     surprise
## 17370         compliant     positive
## 17371              dirt      disgust
## 17372              dirt     negative
## 17373        population     positive
## 17374              bite     negative
## 17375            pretty anticipation
## 17376            pretty          joy
## 17377            pretty     positive
## 17378            pretty        trust
## 17379           hostile        anger
## 17380           hostile      disgust
## 17381           hostile         fear
## 17382           hostile     negative
## 17383            threat        anger
## 17384            threat         fear
## 17385            threat     negative
## 17386              cool     positive
## 17387            change         fear
## 17388          gullible     negative
## 17389          gullible      sadness
## 17390          gullible        trust
## 17391          gullible     negative
## 17392          gullible      sadness
## 17393          gullible        trust
## 17394            greedy      disgust
## 17395            greedy     negative
## 17396               bad        anger
## 17397               bad      disgust
## 17398               bad         fear
## 17399               bad     negative
## 17400               bad      sadness
## 17401            happen anticipation
## 17402            change         fear
## 17403             trump     surprise
## 17404             shoot        anger
## 17405             shoot         fear
## 17406             shoot     negative
## 17407              shit        anger
## 17408              shit      disgust
## 17409              shit     negative
## 17410               gun        anger
## 17411               gun         fear
## 17412               gun     negative
## 17413             smell        anger
## 17414             smell      disgust
## 17415             smell     negative
## 17416          nonsense     negative
## 17417              cool     positive
## 17418          fighting        anger
## 17419          fighting     negative
## 17420              real     positive
## 17421              real        trust
## 17422            reason     positive
## 17423              bite     negative
## 17424            school        trust
## 17425          reliable     positive
## 17426          reliable        trust
## 17427        generosity anticipation
## 17428        generosity          joy
## 17429        generosity     positive
## 17430        generosity     surprise
## 17431        generosity        trust
## 17432           reading     positive
## 17433             trash      disgust
## 17434             trash     negative
## 17435             trash      sadness
## 17436         attention     positive
## 17437            stupid     negative
## 17438         attention     positive
## 17439          valuable     positive
## 17440        exhaustion anticipation
## 17441        exhaustion     negative
## 17442        exhaustion      sadness
## 17443             shame      disgust
## 17444             shame         fear
## 17445             shame     negative
## 17446             shame      sadness
## 17447       accountable     positive
## 17448       accountable        trust
## 17449          resident     positive
## 17450              evil        anger
## 17451              evil      disgust
## 17452              evil         fear
## 17453              evil     negative
## 17454              evil      sadness
## 17455            pretty anticipation
## 17456            pretty          joy
## 17457            pretty     positive
## 17458            pretty        trust
## 17459               hot        anger
## 17460          drinking     negative
## 17461            strike        anger
## 17462            strike     negative
## 17463              fear        anger
## 17464              fear         fear
## 17465              fear     negative
## 17466         knowledge     positive
## 17467               pet     negative
## 17468              bite     negative
## 17469           forward     positive
## 17470        revolution        anger
## 17471        revolution anticipation
## 17472        revolution         fear
## 17473        revolution     negative
## 17474        revolution     positive
## 17475        revolution      sadness
## 17476        revolution     surprise
## 17477            happen anticipation
## 17478              blue      sadness
## 17479        aggressive        anger
## 17480        aggressive         fear
## 17481        aggressive     negative
## 17482             shove        anger
## 17483             shove     negative
## 17484               ass     negative
## 17485               bad        anger
## 17486               bad      disgust
## 17487               bad         fear
## 17488               bad     negative
## 17489               bad      sadness
## 17490               bad        anger
## 17491               bad      disgust
## 17492               bad         fear
## 17493               bad     negative
## 17494               bad      sadness
## 17495            stress     negative
## 17496              time anticipation
## 17497          included     positive
## 17498              hell        anger
## 17499              hell      disgust
## 17500              hell         fear
## 17501              hell     negative
## 17502              hell      sadness
## 17503             cover        trust
## 17504            stress     negative
## 17505               hot        anger
## 17506         worthless        anger
## 17507         worthless      disgust
## 17508         worthless     negative
## 17509         worthless      sadness
## 17510               hot        anger
## 17511              slug      disgust
## 17512              slug     negative
## 17513           accused        anger
## 17514           accused         fear
## 17515           accused     negative
## 17516    discrimination        anger
## 17517    discrimination      disgust
## 17518    discrimination         fear
## 17519    discrimination     negative
## 17520    discrimination      sadness
## 17521      organization anticipation
## 17522      organization          joy
## 17523      organization     positive
## 17524      organization     surprise
## 17525      organization        trust
## 17526              lost     negative
## 17527              lost      sadness
## 17528              lead     positive
## 17529      organization anticipation
## 17530      organization          joy
## 17531      organization     positive
## 17532      organization     surprise
## 17533      organization        trust
## 17534              true          joy
## 17535              true     positive
## 17536              true        trust
## 17537              joke     negative
## 17538              damn        anger
## 17539              damn      disgust
## 17540              damn     negative
## 17541              time anticipation
## 17542             tired     negative
## 17543             moron     negative
## 17544             worry anticipation
## 17545             worry         fear
## 17546             worry     negative
## 17547             worry      sadness
## 17548            rescue anticipation
## 17549            rescue          joy
## 17550            rescue     positive
## 17551            rescue     surprise
## 17552            rescue        trust
## 17553               sun anticipation
## 17554               sun          joy
## 17555               sun     positive
## 17556               sun     surprise
## 17557               sun        trust
## 17558              cool     positive
## 17559             guess     surprise
## 17560           violent        anger
## 17561           violent      disgust
## 17562           violent         fear
## 17563           violent     negative
## 17564           violent     surprise
## 17565          laughing          joy
## 17566          laughing     positive
## 17567              dumb     negative
## 17568           chicken         fear
## 17569             rebel        anger
## 17570             rebel         fear
## 17571             rebel     negative
## 17572             start anticipation
## 17573               mad        anger
## 17574               mad      disgust
## 17575               mad         fear
## 17576               mad     negative
## 17577               mad      sadness
## 17578             crazy        anger
## 17579             crazy         fear
## 17580             crazy     negative
## 17581             crazy      sadness
## 17582            pretty anticipation
## 17583            pretty          joy
## 17584            pretty     positive
## 17585            pretty        trust
## 17586          innocent     positive
## 17587          innocent        trust
## 17588            attack        anger
## 17589            attack         fear
## 17590            attack     negative
## 17591              shit        anger
## 17592              shit      disgust
## 17593              shit     negative
## 17594              true          joy
## 17595              true     positive
## 17596              true        trust
## 17597          ignorant      disgust
## 17598          ignorant     negative
## 17599            writer     positive
## 17600             stray     negative
## 17601            leeway     positive
## 17602             guess     surprise
## 17603             blame        anger
## 17604             blame      disgust
## 17605             blame     negative
## 17606             money        anger
## 17607             money anticipation
## 17608             money          joy
## 17609             money     positive
## 17610             money     surprise
## 17611             money        trust
## 17612           happily          joy
## 17613           happily     positive
## 17614          continue anticipation
## 17615          continue     positive
## 17616          continue        trust
## 17617             money        anger
## 17618             money anticipation
## 17619             money          joy
## 17620             money     positive
## 17621             money     surprise
## 17622             money        trust
## 17623            growth     positive
## 17624        population     positive
## 17625            growth     positive
## 17626              grow anticipation
## 17627              grow          joy
## 17628              grow     positive
## 17629              grow        trust
## 17630            growth     positive
## 17631            poorly     negative
## 17632            excess     negative
## 17633        population     positive
## 17634            growth     positive
## 17635              rail        anger
## 17636              rail anticipation
## 17637              rail     negative
## 17638        population     positive
## 17639            growth     positive
## 17640              dumb     negative
## 17641            public anticipation
## 17642            public     positive
## 17643              rail        anger
## 17644              rail anticipation
## 17645              rail     negative
## 17646            public anticipation
## 17647            public     positive
## 17648          reliable     positive
## 17649          reliable        trust
## 17650               don     positive
## 17651               don        trust
## 17652              rail        anger
## 17653              rail anticipation
## 17654              rail     negative
## 17655           deserve        anger
## 17656           deserve anticipation
## 17657           deserve     positive
## 17658           deserve        trust
## 17659          oblivion        anger
## 17660          oblivion         fear
## 17661          oblivion     negative
## 17662              vote        anger
## 17663              vote anticipation
## 17664              vote          joy
## 17665              vote     negative
## 17666              vote     positive
## 17667              vote      sadness
## 17668              vote     surprise
## 17669              vote        trust
## 17670          oblivion        anger
## 17671          oblivion         fear
## 17672          oblivion     negative
## 17673          majority          joy
## 17674          majority     positive
## 17675          majority        trust
## 17676        population     positive
## 17677            growth     positive
## 17678            growth     positive
## 17679           heavily     negative
## 17680              talk     positive
## 17681            growth     positive
## 17682            expect anticipation
## 17683            expect     positive
## 17684            expect     surprise
## 17685            expect        trust
## 17686             worse         fear
## 17687             worse     negative
## 17688             worse      sadness
## 17689            demand        anger
## 17690            demand     negative
## 17691             start anticipation
## 17692          building     positive
## 17693         efficient anticipation
## 17694         efficient     positive
## 17695         efficient        trust
## 17696            debtor     negative
## 17697             troll        anger
## 17698             troll         fear
## 17699             troll     negative
## 17700            public anticipation
## 17701            public     positive
## 17702            public anticipation
## 17703            public     positive
## 17704            public anticipation
## 17705            public     positive
## 17706             blast        anger
## 17707             blast         fear
## 17708             blast     negative
## 17709             blast     surprise
## 17710            submit anticipation
## 17711             agree     positive
## 17712           improve anticipation
## 17713           improve          joy
## 17714           improve     positive
## 17715           improve        trust
## 17716            public anticipation
## 17717            public     positive
## 17718            reason     positive
## 17719            depend anticipation
## 17720            depend        trust
## 17721           commute     positive
## 17722           chicken         fear
## 17723             start anticipation
## 17724            giving     positive
## 17725             build     positive
## 17726          building     positive
## 17727          minority     negative
## 17728         segregate        anger
## 17729         segregate      disgust
## 17730         segregate     negative
## 17731         segregate      sadness
## 17732           heavily     negative
## 17733         community     positive
## 17734         destroyed        anger
## 17735         destroyed         fear
## 17736         destroyed     negative
## 17737         destroyed      sadness
## 17738             cruel        anger
## 17739             cruel      disgust
## 17740             cruel         fear
## 17741             cruel     negative
## 17742             cruel      sadness
## 17743       devastating        anger
## 17744       devastating      disgust
## 17745       devastating         fear
## 17746       devastating     negative
## 17747       devastating      sadness
## 17748       devastating        trust
## 17749             alive anticipation
## 17750             alive          joy
## 17751             alive     positive
## 17752             alive        trust
## 17753              rule         fear
## 17754              rule        trust
## 17755              rule         fear
## 17756              rule        trust
## 17757              hurt        anger
## 17758              hurt         fear
## 17759              hurt     negative
## 17760              hurt      sadness
## 17761           justice     positive
## 17762           justice        trust
## 17763          ignorant      disgust
## 17764          ignorant     negative
## 17765           removal     negative
## 17766          planning anticipation
## 17767          planning     positive
## 17768          planning        trust
## 17769        uneducated     negative
## 17770        uneducated      sadness
## 17771          planning anticipation
## 17772          planning     positive
## 17773          planning        trust
## 17774            pretty anticipation
## 17775            pretty          joy
## 17776            pretty     positive
## 17777            pretty        trust
## 17778          building     positive
## 17779            public anticipation
## 17780            public     positive
## 17781       opportunity anticipation
## 17782       opportunity     positive
## 17783         efficient anticipation
## 17784         efficient     positive
## 17785         efficient        trust
## 17786        contribute     positive
## 17787        congestion     negative
## 17788             quote anticipation
## 17789             quote     negative
## 17790             quote     positive
## 17791             quote     surprise
## 17792        government         fear
## 17793        government     negative
## 17794      neighborhood anticipation
## 17795      neighborhood anticipation
## 17796         dangerous         fear
## 17797         dangerous     negative
## 17798             noise     negative
## 17799         pollution      disgust
## 17800         pollution     negative
## 17801        constantly        trust
## 17802            happen anticipation
## 17803           benefit     positive
## 17804             buddy anticipation
## 17805             buddy          joy
## 17806             buddy     positive
## 17807             buddy        trust
## 17808              rock     positive
## 17809         displaced        anger
## 17810         displaced         fear
## 17811         displaced      sadness
## 17812            fellow     positive
## 17813            fellow        trust
## 17814           diverse     negative
## 17815           diverse     positive
## 17816             shape     positive
## 17817          majority          joy
## 17818          majority     positive
## 17819          majority        trust
## 17820         elevation anticipation
## 17821         elevation         fear
## 17822         elevation          joy
## 17823         elevation     positive
## 17824         elevation        trust
## 17825         elevation anticipation
## 17826         elevation         fear
## 17827         elevation          joy
## 17828         elevation     positive
## 17829         elevation        trust
## 17830            county        trust
## 17831           council anticipation
## 17832           council     positive
## 17833           council        trust
## 17834           forward     positive
## 17835         complaint        anger
## 17836         complaint     negative
## 17837             sugar     positive
## 17838              land     positive
## 17839             mayor     positive
## 17840             worse         fear
## 17841             worse     negative
## 17842             worse      sadness
## 17843        congestion     negative
## 17844        completely     positive
## 17845          continue anticipation
## 17846          continue     positive
## 17847          continue        trust
## 17848            fairly     positive
## 17849            fairly        trust
## 17850            reason     positive
## 17851           obvious     positive
## 17852           obvious        trust
## 17853             troll        anger
## 17854             troll         fear
## 17855             troll     negative
## 17856             troll        anger
## 17857             troll         fear
## 17858             troll     negative
## 17859          convince anticipation
## 17860          convince     positive
## 17861          convince        trust
## 17862        population     positive
## 17863           forgive     positive
## 17864             troll        anger
## 17865             troll         fear
## 17866             troll     negative
## 17867            reason     positive
## 17868          building     positive
## 17869             troll        anger
## 17870             troll         fear
## 17871             troll     negative
## 17872               don     positive
## 17873               don        trust
## 17874           edition anticipation
## 17875             havoc        anger
## 17876             havoc         fear
## 17877             havoc     negative
## 17878              bold     positive
## 17879             couch      sadness
## 17880             cover        trust
## 17881          convince anticipation
## 17882          convince     positive
## 17883          convince        trust
## 17884        population     positive
## 17885              hate        anger
## 17886              hate      disgust
## 17887              hate         fear
## 17888              hate     negative
## 17889              hate      sadness
## 17890            denial     negative
## 17891        population     positive
## 17892            reason     positive
## 17893            demand        anger
## 17894            demand     negative
## 17895            reason     positive
## 17896             legal     positive
## 17897             legal        trust
## 17898             build     positive
## 17899              hope anticipation
## 17900              hope          joy
## 17901              hope     positive
## 17902              hope     surprise
## 17903              hope        trust
## 17904      neighborhood anticipation
## 17905         destroyed        anger
## 17906         destroyed         fear
## 17907         destroyed     negative
## 17908         destroyed      sadness
## 17909            actual     positive
## 17910              fair     positive
## 17911              rule         fear
## 17912              rule        trust
## 17913          civility     positive
## 17914             silly          joy
## 17915             silly     negative
## 17916            demand        anger
## 17917            demand     negative
## 17918               bad        anger
## 17919               bad      disgust
## 17920               bad         fear
## 17921               bad     negative
## 17922               bad      sadness
## 17923          building     positive
## 17924            create          joy
## 17925            create     positive
## 17926             focus     positive
## 17927             build     positive
## 17928         efficient anticipation
## 17929         efficient     positive
## 17930         efficient        trust
## 17931            ground        trust
## 17932            change         fear
## 17933             build     positive
## 17934     comprehensive     positive
## 17935              plan anticipation
## 17936            expect anticipation
## 17937            expect     positive
## 17938            expect     surprise
## 17939            expect        trust
## 17940            change         fear
## 17941             build     positive
## 17942            tackle        anger
## 17943            tackle     surprise
## 17944            public anticipation
## 17945            public     positive
## 17946             money        anger
## 17947             money anticipation
## 17948             money          joy
## 17949             money     positive
## 17950             money     surprise
## 17951             money        trust
## 17952             spent     negative
## 17953               law        trust
## 17954            public anticipation
## 17955            public     positive
## 17956             spent     negative
## 17957              time anticipation
## 17958          politics        anger
## 17959            change         fear
## 17960          planning anticipation
## 17961          planning     positive
## 17962          planning        trust
## 17963          improved     positive
## 17964         precursor anticipation
## 17965           blinded     negative
## 17966           freedom          joy
## 17967           freedom     positive
## 17968           freedom        trust
## 17969            option     positive
## 17970            option     positive
## 17971            pretty anticipation
## 17972            pretty          joy
## 17973            pretty     positive
## 17974            pretty        trust
## 17975            pretty anticipation
## 17976            pretty          joy
## 17977            pretty     positive
## 17978            pretty        trust
## 17979           obvious     positive
## 17980           obvious        trust
## 17981        ultimately anticipation
## 17982        ultimately     positive
## 17983        irrelevant     negative
## 17984            afford     positive
## 17985            luxury          joy
## 17986            luxury     positive
## 17987          stranded     negative
## 17988            afford     positive
## 17989            public anticipation
## 17990            public     positive
## 17991           council anticipation
## 17992           council     positive
## 17993           council        trust
## 17994             argue        anger
## 17995             argue     negative
## 17996            public anticipation
## 17997            public     positive
## 17998              time anticipation
## 17999         demanding     negative
## 18000             break     surprise
## 18001             break     surprise
## 18002            stolen        anger
## 18003            stolen     negative
## 18004             wrong     negative
## 18005               don     positive
## 18006               don        trust
## 18007            option     positive
## 18008            change         fear
## 18009           benefit     positive
## 18010            stolen        anger
## 18011            stolen     negative
## 18012              time anticipation
## 18013           minimum     negative
## 18014          inferior     negative
## 18015          inferior      sadness
## 18016           special          joy
## 18017           special     positive
## 18018           benefit     positive
## 18019          wasteful        anger
## 18020          wasteful      disgust
## 18021          wasteful     negative
## 18022          wasteful      sadness
## 18023             break     surprise
## 18024             decay         fear
## 18025             decay     negative
## 18026             decay      sadness
## 18027              ease     positive
## 18028             theft        anger
## 18029             theft      disgust
## 18030             theft         fear
## 18031             theft     negative
## 18032             theft      sadness
## 18033             steal        anger
## 18034             steal         fear
## 18035             steal     negative
## 18036             steal      sadness
## 18037             argue        anger
## 18038             argue     negative
## 18039           prevent         fear
## 18040             theft        anger
## 18041             theft      disgust
## 18042             theft         fear
## 18043             theft     negative
## 18044             theft      sadness
## 18045            public anticipation
## 18046            public     positive
## 18047            public anticipation
## 18048            public     positive
## 18049              time anticipation
## 18050          personal        trust
## 18051               bad        anger
## 18052               bad      disgust
## 18053               bad         fear
## 18054               bad     negative
## 18055               bad      sadness
## 18056             agree     positive
## 18057            option     positive
## 18058               top anticipation
## 18059               top     positive
## 18060               top        trust
## 18061               top anticipation
## 18062               top     positive
## 18063               top        trust
## 18064             steal        anger
## 18065             steal         fear
## 18066             steal     negative
## 18067             steal      sadness
## 18068            actual     positive
## 18069        delusional        anger
## 18070        delusional         fear
## 18071        delusional     negative
## 18072               top anticipation
## 18073               top     positive
## 18074               top        trust
## 18075            public anticipation
## 18076            public     positive
## 18077         hypocrite      disgust
## 18078         hypocrite     negative
## 18079            reason     positive
## 18080        government         fear
## 18081        government     negative
## 18082            afford     positive
## 18083          inferior     negative
## 18084          inferior      sadness
## 18085        government         fear
## 18086        government     negative
## 18087        impossible     negative
## 18088        impossible      sadness
## 18089               pay anticipation
## 18090               pay          joy
## 18091               pay     positive
## 18092               pay        trust
## 18093              land     positive
## 18094              land     positive
## 18095            actual     positive
## 18096               war         fear
## 18097               war     negative
## 18098           classic     positive
## 18099            scheme     negative
## 18100            growth     positive
## 18101              time anticipation
## 18102             level     positive
## 18103             level        trust
## 18104      productivity     positive
## 18105        experiment anticipation
## 18106        experiment     surprise
## 18107              time anticipation
## 18108              bomb        anger
## 18109              bomb         fear
## 18110              bomb     negative
## 18111              bomb      sadness
## 18112              bomb     surprise
## 18113       maintenance        trust
## 18114             civil     positive
## 18115       maintenance        trust
## 18116             major     positive
## 18117             serve     negative
## 18118             serve        trust
## 18119       maintenance        trust
## 18120            growth     positive
## 18121            scheme     negative
## 18122             extra     positive
## 18123             money        anger
## 18124             money anticipation
## 18125             money          joy
## 18126             money     positive
## 18127             money     surprise
## 18128             money        trust
## 18129              prop     positive
## 18130             money        anger
## 18131             money anticipation
## 18132             money          joy
## 18133             money     positive
## 18134             money     surprise
## 18135             money        trust
## 18136           primary     positive
## 18137              debt     negative
## 18138              debt      sadness
## 18139        ultimately anticipation
## 18140        ultimately     positive
## 18141        government         fear
## 18142        government     negative
## 18143               pay anticipation
## 18144               pay          joy
## 18145               pay     positive
## 18146               pay        trust
## 18147               tax     negative
## 18148               tax      sadness
## 18149         luxurious          joy
## 18150         luxurious     positive
## 18151           supreme     positive
## 18152             court        anger
## 18153             court anticipation
## 18154             court         fear
## 18155               law        trust
## 18156        government         fear
## 18157        government     negative
## 18158      discriminate        anger
## 18159      discriminate     negative
## 18160      discriminate      sadness
## 18161        prohibited        anger
## 18162        prohibited      disgust
## 18163        prohibited         fear
## 18164        prohibited     negative
## 18165         receiving anticipation
## 18166         receiving          joy
## 18167         receiving     positive
## 18168         receiving     surprise
## 18169        government         fear
## 18170        government     negative
## 18171            reason     positive
## 18172        irrelevant     negative
## 18173           renewal     positive
## 18174         conducive     positive
## 18175             worse         fear
## 18176             worse     negative
## 18177             worse      sadness
## 18178        facilitate     positive
## 18179             delay        anger
## 18180             delay      disgust
## 18181             delay         fear
## 18182             delay     negative
## 18183             delay      sadness
## 18184            actual     positive
## 18185       destination anticipation
## 18186       destination         fear
## 18187       destination          joy
## 18188       destination     positive
## 18189       destination      sadness
## 18190       destination     surprise
## 18191              land     positive
## 18192            reason     positive
## 18193             horse        trust
## 18194              fell     negative
## 18195              fell      sadness
## 18196        congestion     negative
## 18197             smell        anger
## 18198             smell      disgust
## 18199             smell     negative
## 18200            fairly     positive
## 18201            fairly        trust
## 18202              farm anticipation
## 18203        supporting     positive
## 18204        supporting        trust
## 18205          absolute     positive
## 18206        congestion     negative
## 18207             noise     negative
## 18208             smell        anger
## 18209             smell      disgust
## 18210             smell     negative
## 18211           disease        anger
## 18212           disease      disgust
## 18213           disease         fear
## 18214           disease     negative
## 18215           disease      sadness
## 18216              lead     positive
## 18217         explosion         fear
## 18218         explosion     negative
## 18219         explosion     surprise
## 18220            growth     positive
## 18221           benefit     positive
## 18222            change         fear
## 18223              time anticipation
## 18224              farm anticipation
## 18225            pretty anticipation
## 18226            pretty          joy
## 18227            pretty     positive
## 18228            pretty        trust
## 18229        irrelevant     negative
## 18230              fell     negative
## 18231              fell      sadness
## 18232          suddenly     surprise
## 18233               don     positive
## 18234               don        trust
## 18235         advantage     positive
## 18236              time anticipation
## 18237              fair     positive
## 18238               eat     positive
## 18239            nation        trust
## 18240             silly          joy
## 18241             silly     negative
## 18242              vote        anger
## 18243              vote anticipation
## 18244              vote          joy
## 18245              vote     negative
## 18246              vote     positive
## 18247              vote      sadness
## 18248              vote     surprise
## 18249              vote        trust
## 18250             truth     positive
## 18251             truth        trust
## 18252            growth     positive
## 18253            growth     positive
## 18254            scheme     negative
## 18255            growth     positive
## 18256            scheme     negative
## 18257             crash         fear
## 18258             crash     negative
## 18259             crash      sadness
## 18260             crash     surprise
## 18261            growth     positive
## 18262       traditional     positive
## 18263            scheme     negative
## 18264          struggle        anger
## 18265          struggle         fear
## 18266          struggle     negative
## 18267          struggle      sadness
## 18268           benefit     positive
## 18269           medical anticipation
## 18270           medical         fear
## 18271           medical     positive
## 18272           medical        trust
## 18273           related        trust
## 18274            public anticipation
## 18275            public     positive
## 18276     controversial        anger
## 18277     controversial     negative
## 18278            growth     positive
## 18279            scheme     negative
## 18280             crash         fear
## 18281             crash     negative
## 18282             crash      sadness
## 18283             crash     surprise
## 18284            growth     positive
## 18285            scheme     negative
## 18286             crash         fear
## 18287             crash     negative
## 18288             crash      sadness
## 18289             crash     surprise
## 18290              lead     positive
## 18291               job     positive
## 18292             haven     positive
## 18293             haven        trust
## 18294          reliable     positive
## 18295          reliable        trust
## 18296            public anticipation
## 18297            public     positive
## 18298        congestion     negative
## 18299              time anticipation
## 18300              deal anticipation
## 18301              deal          joy
## 18302              deal     positive
## 18303              deal     surprise
## 18304              deal        trust
## 18305            actual     positive
## 18306             study     positive
## 18307            public anticipation
## 18308            public     positive
## 18309               job     positive
## 18310            scheme     negative
## 18311               bad        anger
## 18312               bad      disgust
## 18313               bad         fear
## 18314               bad     negative
## 18315               bad      sadness
## 18316               job     positive
## 18317           explain     positive
## 18318           explain        trust
## 18319             major     positive
## 18320            prefer     positive
## 18321            prefer        trust
## 18322             study     positive
## 18323               job     positive
## 18324           attempt anticipation
## 18325             quote anticipation
## 18326             quote     negative
## 18327             quote     positive
## 18328             quote     surprise
## 18329             study     positive
## 18330          negative     negative
## 18331          negative      sadness
## 18332         including     positive
## 18333        congestion     negative
## 18334              land     positive
## 18335         pollution      disgust
## 18336         pollution     negative
## 18337            public anticipation
## 18338            public     positive
## 18339           provide     positive
## 18340           provide        trust
## 18341         efficient anticipation
## 18342         efficient     positive
## 18343         efficient        trust
## 18344            public anticipation
## 18345            public     positive
## 18346           commute     positive
## 18347         providing anticipation
## 18348         providing          joy
## 18349         providing     positive
## 18350         providing        trust
## 18351             study     positive
## 18352         statement     positive
## 18353         statement        trust
## 18354               don     positive
## 18355               don        trust
## 18356              lead     positive
## 18357             quote anticipation
## 18358             quote     negative
## 18359             quote     positive
## 18360             quote     surprise
## 18361             study     positive
## 18362              time anticipation
## 18363            larger      disgust
## 18364            larger     surprise
## 18365            larger        trust
## 18366            versus        anger
## 18367            versus     negative
## 18368        congestion     negative
## 18369        congestion     negative
## 18370             study     positive
## 18371        congestion     negative
## 18372        congestion     negative
## 18373           commute     positive
## 18374               don     positive
## 18375               don        trust
## 18376               don     positive
## 18377               don        trust
## 18378            afford     positive
## 18379               don     positive
## 18380               don        trust
## 18381         concerned         fear
## 18382         concerned      sadness
## 18383            vanity     negative
## 18384             smell        anger
## 18385             smell      disgust
## 18386             smell     negative
## 18387        impossible     negative
## 18388        impossible      sadness
## 18389               pay anticipation
## 18390               pay          joy
## 18391               pay     positive
## 18392               pay        trust
## 18393            vanity     negative
## 18394          bankrupt         fear
## 18395          bankrupt     negative
## 18396          bankrupt      sadness
## 18397             force        anger
## 18398             force         fear
## 18399             force     negative
## 18400            ignore     negative
## 18401               don     positive
## 18402               don        trust
## 18403               pay anticipation
## 18404               pay          joy
## 18405               pay     positive
## 18406               pay        trust
## 18407            dinner     positive
## 18408             split     negative
## 18409             buddy anticipation
## 18410             buddy          joy
## 18411             buddy     positive
## 18412             buddy        trust
## 18413            income anticipation
## 18414            income          joy
## 18415            income     negative
## 18416            income     positive
## 18417            income      sadness
## 18418            income        trust
## 18419            afford     positive
## 18420             split     negative
## 18421            actual     positive
## 18422           benefit     positive
## 18423           benefit     positive
## 18424           benefit     positive
## 18425           provide     positive
## 18426           provide        trust
## 18427            larger      disgust
## 18428            larger     surprise
## 18429            larger        trust
## 18430             labor anticipation
## 18431             labor          joy
## 18432             labor     positive
## 18433             labor     surprise
## 18434             labor        trust
## 18435             vital     positive
## 18436           economy        trust
## 18437             sense     positive
## 18438            damage        anger
## 18439            damage      disgust
## 18440            damage     negative
## 18441            damage      sadness
## 18442               pay anticipation
## 18443               pay          joy
## 18444               pay     positive
## 18445               pay        trust
## 18446          occupant     positive
## 18447          occupant        trust
## 18448         dangerous         fear
## 18449         dangerous     negative
## 18450               pay anticipation
## 18451               pay          joy
## 18452               pay     positive
## 18453               pay        trust
## 18454              rail        anger
## 18455              rail anticipation
## 18456              rail     negative
## 18457          customer     positive
## 18458          personal        trust
## 18459        ultimately anticipation
## 18460        ultimately     positive
## 18461        supporting     positive
## 18462        supporting        trust
## 18463               don     positive
## 18464               don        trust
## 18465             level     positive
## 18466             level        trust
## 18467             sense     positive
## 18468          continue anticipation
## 18469          continue     positive
## 18470          continue        trust
## 18471          increase     positive
## 18472        population     positive
## 18473           related        trust
## 18474              bang        anger
## 18475              bang      disgust
## 18476              bang         fear
## 18477              bang     negative
## 18478              bang      sadness
## 18479              bang     surprise
## 18480              buck         fear
## 18481              buck     negative
## 18482              buck     positive
## 18483              buck     surprise
## 18484           savings     positive
## 18485             start anticipation
## 18486         passenger anticipation
## 18487             lower     negative
## 18488             lower      sadness
## 18489              bang        anger
## 18490              bang      disgust
## 18491              bang         fear
## 18492              bang     negative
## 18493              bang      sadness
## 18494              bang     surprise
## 18495              buck         fear
## 18496              buck     negative
## 18497              buck     positive
## 18498              buck     surprise
## 18499              time anticipation
## 18500          expected anticipation
## 18501        population     positive
## 18502             birth anticipation
## 18503             birth         fear
## 18504             birth          joy
## 18505             birth     positive
## 18506             birth        trust
## 18507          continue anticipation
## 18508          continue     positive
## 18509          continue        trust
## 18510           decline     negative
## 18511        population     positive
## 18512          planning anticipation
## 18513          planning     positive
## 18514          planning        trust
## 18515        profession     positive
## 18516              time anticipation
## 18517             start anticipation
## 18518       approaching anticipation
## 18519        enthusiasm anticipation
## 18520        enthusiasm          joy
## 18521        enthusiasm     positive
## 18522        enthusiasm     surprise
## 18523          optimism anticipation
## 18524          optimism          joy
## 18525          optimism     positive
## 18526          optimism     surprise
## 18527          optimism        trust
## 18528          disagree        anger
## 18529          disagree     negative
## 18530           despise        anger
## 18531           despise      disgust
## 18532           despise     negative
## 18533       inefficient     negative
## 18534       inefficient      sadness
## 18535           respect anticipation
## 18536           respect          joy
## 18537           respect     positive
## 18538           respect        trust
## 18539          engaging          joy
## 18540          engaging     positive
## 18541          engaging        trust
## 18542       ineffective     negative
## 18543       ineffective     negative
## 18544          argument        anger
## 18545          argument     negative
## 18546          argument        anger
## 18547          argument     negative
## 18548       immediately anticipation
## 18549       immediately     negative
## 18550       immediately     positive
## 18551            demand        anger
## 18552            demand     negative
## 18553     understanding     positive
## 18554     understanding        trust
## 18555              time anticipation
## 18556          argument        anger
## 18557          argument     negative
## 18558         alleviate     positive
## 18559          reliable     positive
## 18560          reliable        trust
## 18561            public anticipation
## 18562            public     positive
## 18563          planning anticipation
## 18564          planning     positive
## 18565          planning        trust
## 18566        profession     positive
## 18567          increase     positive
## 18568          increase     positive
## 18569        ultimately anticipation
## 18570        ultimately     positive
## 18571             wound        anger
## 18572             wound         fear
## 18573             wound     negative
## 18574             wound      sadness
## 18575          increase     positive
## 18576          increase     positive
## 18577        accomplish          joy
## 18578        accomplish     positive
## 18579            demand        anger
## 18580            demand     negative
## 18581        accomplish          joy
## 18582        accomplish     positive
## 18583          planning anticipation
## 18584          planning     positive
## 18585          planning        trust
## 18586           failure      disgust
## 18587           failure         fear
## 18588           failure     negative
## 18589           failure      sadness
## 18590         infection         fear
## 18591         infection     negative
## 18592          solution     positive
## 18593              land     positive
## 18594            broken        anger
## 18595            broken         fear
## 18596            broken     negative
## 18597            broken      sadness
## 18598           fallacy     negative
## 18599          commerce        trust
## 18600             break     surprise
## 18601              time anticipation
## 18602          solution     positive
## 18603              land     positive
## 18604             sense     positive
## 18605          credible     positive
## 18606          credible        trust
## 18607     comprehensive     positive
## 18608              plan anticipation
## 18609              rail        anger
## 18610              rail anticipation
## 18611              rail     negative
## 18612              plan anticipation
## 18613       destructive        anger
## 18614       destructive      disgust
## 18615       destructive         fear
## 18616       destructive     negative
## 18617           provide     positive
## 18618           provide        trust
## 18619       fashionable     positive
## 18620            wealth          joy
## 18621            wealth     positive
## 18622            wealth        trust
## 18623           success anticipation
## 18624           success          joy
## 18625           success     positive
## 18626         supported     positive
## 18627          building     positive
## 18628              rail        anger
## 18629              rail anticipation
## 18630              rail     negative
## 18631          solution     positive
## 18632          building     positive
## 18633              rail        anger
## 18634              rail anticipation
## 18635              rail     negative
## 18636       inefficient     negative
## 18637       inefficient      sadness
## 18638              land     positive
## 18639          solution     positive
## 18640         encourage          joy
## 18641         encourage     positive
## 18642         encourage        trust
## 18643            growth     positive
## 18644             share anticipation
## 18645             share          joy
## 18646             share     positive
## 18647             share        trust
## 18648            prefer     positive
## 18649            prefer        trust
## 18650             share anticipation
## 18651             share          joy
## 18652             share     positive
## 18653             share        trust
## 18654      neighborhood anticipation
## 18655            demand        anger
## 18656            demand     negative
## 18657     unsustainable     negative
## 18658              debt     negative
## 18659              debt      sadness
## 18660            actual     positive
## 18661           economy        trust
## 18662               pay anticipation
## 18663               pay          joy
## 18664               pay     positive
## 18665               pay        trust
## 18666              true          joy
## 18667              true     positive
## 18668              true        trust
## 18669            pretty anticipation
## 18670            pretty          joy
## 18671            pretty     positive
## 18672            pretty        trust
## 18673            growth     positive
## 18674            scheme     negative
## 18675           explain     positive
## 18676           explain        trust
## 18677     unsustainable     negative
## 18678              debt     negative
## 18679              debt      sadness
## 18680           obesity      disgust
## 18681           obesity     negative
## 18682           obesity      sadness
## 18683         pollution      disgust
## 18684         pollution     negative
## 18685            choice     positive
## 18686           leading        trust
## 18687          reliance     positive
## 18688          reliance        trust
## 18689            damage        anger
## 18690            damage      disgust
## 18691            damage     negative
## 18692            damage      sadness
## 18693        widespread     positive
## 18694            larger      disgust
## 18695            larger     surprise
## 18696            larger        trust
## 18697          increase     positive
## 18698        accomplish          joy
## 18699        accomplish     positive
## 18700         traveling     positive
## 18701           magical anticipation
## 18702           magical          joy
## 18703           magical     positive
## 18704           magical     surprise
## 18705         traveling     positive
## 18706          building     positive
## 18707           economy        trust
## 18708        accessible     positive
## 18709          friendly anticipation
## 18710          friendly          joy
## 18711          friendly     positive
## 18712          friendly        trust
## 18713              love          joy
## 18714              love     positive
## 18715         passenger anticipation
## 18716             start anticipation
## 18717        prosperity     positive
## 18718          minority     negative
## 18719              rail        anger
## 18720              rail anticipation
## 18721              rail     negative
## 18722             guess     surprise
## 18723              time anticipation
## 18724              love          joy
## 18725              love     positive
## 18726          mountain anticipation
## 18727              bomb        anger
## 18728              bomb         fear
## 18729              bomb     negative
## 18730              bomb      sadness
## 18731              bomb     surprise
## 18732              bomb        anger
## 18733              bomb         fear
## 18734              bomb     negative
## 18735              bomb      sadness
## 18736              bomb     surprise
## 18737              farm anticipation
## 18738              farm anticipation
## 18739              bomb        anger
## 18740              bomb         fear
## 18741              bomb     negative
## 18742              bomb      sadness
## 18743              bomb     surprise
## 18744          relevant     positive
## 18745          relevant        trust
## 18746           feeling        anger
## 18747           feeling anticipation
## 18748           feeling      disgust
## 18749           feeling         fear
## 18750           feeling          joy
## 18751           feeling     negative
## 18752           feeling     positive
## 18753           feeling      sadness
## 18754           feeling     surprise
## 18755           feeling        trust
## 18756            desert        anger
## 18757            desert      disgust
## 18758            desert         fear
## 18759            desert     negative
## 18760            desert      sadness
## 18761               war         fear
## 18762               war     negative
## 18763              bomb        anger
## 18764              bomb         fear
## 18765              bomb     negative
## 18766              bomb      sadness
## 18767              bomb     surprise
## 18768            result anticipation
## 18769               ass     negative
## 18770              bomb        anger
## 18771              bomb         fear
## 18772              bomb     negative
## 18773              bomb      sadness
## 18774              bomb     surprise
## 18775               war         fear
## 18776               war     negative
## 18777            happen anticipation
## 18778              bomb        anger
## 18779              bomb         fear
## 18780              bomb     negative
## 18781              bomb      sadness
## 18782              bomb     surprise
## 18783              bomb        anger
## 18784              bomb         fear
## 18785              bomb     negative
## 18786              bomb      sadness
## 18787              bomb     surprise
## 18788               war         fear
## 18789               war     negative
## 18790               war         fear
## 18791               war     negative
## 18792               war         fear
## 18793               war     negative
## 18794              torn     negative
## 18795              land     positive
## 18796              bath     positive
## 18797              love          joy
## 18798              love     positive
## 18799              time anticipation
## 18800          favorite          joy
## 18801          favorite     positive
## 18802          favorite        trust
## 18803            change         fear
## 18804           horizon anticipation
## 18805           horizon     positive
## 18806              dawn anticipation
## 18807              dawn          joy
## 18808              dawn     positive
## 18809              dawn     surprise
## 18810              dawn        trust
## 18811            giving     positive
## 18812              time anticipation
## 18813          favorite          joy
## 18814          favorite     positive
## 18815          favorite        trust
## 18816              kiss anticipation
## 18817              kiss          joy
## 18818              kiss     positive
## 18819              kiss     surprise
## 18820            joined     positive
## 18821           subject     negative
## 18822           default      disgust
## 18823           default         fear
## 18824           default     negative
## 18825           default      sadness
## 18826              join     positive
## 18827            action     positive
## 18828           contact     positive
## 18829               die         fear
## 18830               die     negative
## 18831               die      sadness
## 18832               hot        anger
## 18833            change         fear
## 18834               die         fear
## 18835               die     negative
## 18836               die      sadness
## 18837              cold     negative
## 18838            change         fear
## 18839               die         fear
## 18840               die     negative
## 18841               die      sadness
## 18842            change         fear
## 18843               die         fear
## 18844               die     negative
## 18845               die      sadness
## 18846             rainy      sadness
## 18847            change         fear
## 18848               die         fear
## 18849               die     negative
## 18850               die      sadness
## 18851            change         fear
## 18852               die         fear
## 18853               die     negative
## 18854               die      sadness
## 18855            change         fear
## 18856               die         fear
## 18857               die     negative
## 18858               die      sadness
## 18859              kill         fear
## 18860              kill     negative
## 18861              kill      sadness
## 18862             force        anger
## 18863             force         fear
## 18864             force     negative
## 18865             trump     surprise
## 18866              jail         fear
## 18867              jail     negative
## 18868              jail      sadness
## 18869            flying         fear
## 18870            flying     positive
## 18871            change         fear
## 18872               don     positive
## 18873               don        trust
## 18874            flying         fear
## 18875            flying     positive
## 18876            dinner     positive
## 18877            change         fear
## 18878             level     positive
## 18879             level        trust
## 18880               don     positive
## 18881               don        trust
## 18882            forget     negative
## 18883               sun anticipation
## 18884               sun          joy
## 18885               sun     positive
## 18886               sun     surprise
## 18887               sun        trust
## 18888              cool     positive
## 18889         hurricane         fear
## 18890         hurricane     negative
## 18891            cringe      disgust
## 18892            cringe         fear
## 18893            cringe     negative
## 18894            cringe      sadness
## 18895         hurricane         fear
## 18896         hurricane     negative
## 18897            coming anticipation
## 18898            change         fear
## 18899         hurricane         fear
## 18900         hurricane     negative
## 18901             moral        anger
## 18902             moral     positive
## 18903             moral        trust
## 18904             panic         fear
## 18905             panic     negative
## 18906          included     positive
## 18907           liberal     negative
## 18908           liberal     positive
## 18909       grandmother     positive
## 18910             panic         fear
## 18911             panic     negative
## 18912             trump     surprise
## 18913       responsible     positive
## 18914       responsible        trust
## 18915            action     positive
## 18916              star anticipation
## 18917              star          joy
## 18918              star     positive
## 18919              star        trust
## 18920             ready anticipation
## 18921             ready anticipation
## 18922             ready anticipation
## 18923              time anticipation
## 18924               hit        anger
## 18925               hit     negative
## 18926         infantile        anger
## 18927         infantile      disgust
## 18928         infantile     negative
## 18929            giving     positive
## 18930        government         fear
## 18931        government     negative
## 18932             money        anger
## 18933             money anticipation
## 18934             money          joy
## 18935             money     positive
## 18936             money     surprise
## 18937             money        trust
## 18938            change         fear
## 18939            suffer     negative
## 18940          fighting        anger
## 18941          fighting     negative
## 18942            change         fear
## 18943          suddenly     surprise
## 18944       responsible     positive
## 18945       responsible        trust
## 18946             wrong     negative
## 18947             pride          joy
## 18948             pride     positive
## 18949             bigot        anger
## 18950             bigot      disgust
## 18951             bigot         fear
## 18952             bigot     negative
## 18953        completely     positive
## 18954         miserable        anger
## 18955         miserable      disgust
## 18956         miserable     negative
## 18957         miserable      sadness
## 18958              hate        anger
## 18959              hate      disgust
## 18960              hate         fear
## 18961              hate     negative
## 18962              hate      sadness
## 18963            relief     positive
## 18964          fighting        anger
## 18965          fighting     negative
## 18966            change         fear
## 18967          enjoying anticipation
## 18968          enjoying          joy
## 18969          enjoying     positive
## 18970          enjoying        trust
## 18971           jealous        anger
## 18972           jealous      disgust
## 18973           jealous     negative
## 18974            change         fear
## 18975              real     positive
## 18976              real        trust
## 18977           warning         fear
## 18978               hit        anger
## 18979               hit     negative
## 18980               hot        anger
## 18981            county        trust
## 18982              time anticipation
## 18983              glad anticipation
## 18984              glad          joy
## 18985              glad     positive
## 18986          electric          joy
## 18987          electric     positive
## 18988          electric     surprise
## 18989         pollution      disgust
## 18990         pollution     negative
## 18991       congressman        trust
## 18992           harmful        anger
## 18993           harmful      disgust
## 18994           harmful         fear
## 18995           harmful     negative
## 18996           harmful      sadness
## 18997              hail     negative
## 18998              hail     positive
## 18999              hail        trust
## 19000         petroleum      disgust
## 19001         petroleum     negative
## 19002         petroleum     positive
## 19003               sun anticipation
## 19004               sun          joy
## 19005               sun     positive
## 19006               sun     surprise
## 19007               sun        trust
## 19008               god anticipation
## 19009               god         fear
## 19010               god          joy
## 19011               god     positive
## 19012               god        trust
## 19013            pretty anticipation
## 19014            pretty          joy
## 19015            pretty     positive
## 19016            pretty        trust
## 19017              cool     positive
## 19018            change         fear
## 19019             sense     positive
## 19020             sunny anticipation
## 19021             sunny          joy
## 19022             sunny     positive
## 19023             sunny     surprise
## 19024          overcast     negative
## 19025          argument        anger
## 19026          argument     negative
## 19027            pretty anticipation
## 19028            pretty          joy
## 19029            pretty     positive
## 19030            pretty        trust
## 19031              cold     negative
## 19032             usual     positive
## 19033             usual        trust
## 19034       thermometer        trust
## 19035              love          joy
## 19036              love     positive
## 19037             green          joy
## 19038             green     positive
## 19039             green        trust
## 19040               sun anticipation
## 19041               sun          joy
## 19042               sun     positive
## 19043               sun     surprise
## 19044               sun        trust
## 19045              kill         fear
## 19046              kill     negative
## 19047              kill      sadness
## 19048             decay         fear
## 19049             decay     negative
## 19050             decay      sadness
## 19051            mother anticipation
## 19052            mother          joy
## 19053            mother     negative
## 19054            mother     positive
## 19055            mother      sadness
## 19056            mother        trust
## 19057          humanity          joy
## 19058          humanity     positive
## 19059          humanity        trust
## 19060            stupid     negative
## 19061           useless     negative
## 19062            litter     negative
## 19063            actual     positive
## 19064              harm         fear
## 19065              harm     negative
## 19066        government         fear
## 19067        government     negative
## 19068          nonsense     negative
## 19069            change         fear
## 19070             silly          joy
## 19071             silly     negative
## 19072              deny        anger
## 19073              deny     negative
## 19074            change         fear
## 19075           obvious     positive
## 19076           obvious        trust
## 19077             proof        trust
## 19078            shrunk     negative
## 19079      overwhelming     positive
## 19080        scientific     positive
## 19081        scientific        trust
## 19082         existence     positive
## 19083            change         fear
## 19084             trend     positive
## 19085             trend     positive
## 19086            rising anticipation
## 19087            rising          joy
## 19088            rising     positive
## 19089            rising anticipation
## 19090            rising          joy
## 19091            rising     positive
## 19092               sea     positive
## 19093               sea     positive
## 19094            rising anticipation
## 19095            rising          joy
## 19096            rising     positive
## 19097            change         fear
## 19098               sea     positive
## 19099             level     positive
## 19100             level        trust
## 19101               sea     positive
## 19102           decline     negative
## 19103             cover        trust
## 19104          alarming         fear
## 19105          alarming     negative
## 19106          alarming     surprise
## 19107            change         fear
## 19108           intense        anger
## 19109           intense      disgust
## 19110           intense         fear
## 19111           intense          joy
## 19112           intense     negative
## 19113           intense     positive
## 19114           intense     surprise
## 19115           intense        trust
## 19116            change         fear
## 19117            excess     negative
## 19118          absorbed     positive
## 19119           leading        trust
## 19120          decrease     negative
## 19121              harm         fear
## 19122              harm     negative
## 19123            marine        trust
## 19124        scientific     positive
## 19125        scientific        trust
## 19126         including     positive
## 19127           academy     positive
## 19128        scientific     positive
## 19129        scientific        trust
## 19130            change         fear
## 19131              real     positive
## 19132              real        trust
## 19133         extensive     positive
## 19134        supporting     positive
## 19135        supporting        trust
## 19136            change         fear
## 19137        scientific     positive
## 19138        scientific        trust
## 19139         community     positive
## 19140             study     positive
## 19141            refine     positive
## 19142     understanding     positive
## 19143     understanding        trust
## 19144            change         fear
## 19145           remains      disgust
## 19146           remains         fear
## 19147           remains     negative
## 19148           remains     positive
## 19149           remains        trust
## 19150             lucky          joy
## 19151             lucky     positive
## 19152             lucky     surprise
## 19153            change         fear
## 19154              cold     negative
## 19155               hot        anger
## 19156               gun        anger
## 19157               gun         fear
## 19158               gun     negative
## 19159          agreeing     positive
## 19160          agreeing        trust
## 19161            friend          joy
## 19162            friend     positive
## 19163            friend        trust
## 19164            change         fear
## 19165             fraud        anger
## 19166             fraud     negative
## 19167             build     positive
## 19168          believed        trust
## 19169               sea     positive
## 19170         dangerous         fear
## 19171         dangerous     negative
## 19172            degree     positive
## 19173             money        anger
## 19174             money anticipation
## 19175             money          joy
## 19176             money     positive
## 19177             money     surprise
## 19178             money        trust
## 19179         skeptical     negative
## 19180            change         fear
## 19181            degree     positive
## 19182           gradual anticipation
## 19183            actual     positive
## 19184               sea     positive
## 19185          increase     positive
## 19186             cover        trust
## 19187             fixed        trust
## 19188           anxious anticipation
## 19189           anxious         fear
## 19190           anxious     negative
## 19191              warn anticipation
## 19192              warn         fear
## 19193              warn     negative
## 19194              warn     surprise
## 19195              warn        trust
## 19196              rest     positive
## 19197            change         fear
## 19198             enjoy anticipation
## 19199             enjoy          joy
## 19200             enjoy     positive
## 19201             enjoy        trust
## 19202           spoiler     negative
## 19203           spoiler      sadness
## 19204              real     positive
## 19205              real        trust
## 19206            expect anticipation
## 19207            expect     positive
## 19208            expect     surprise
## 19209            expect        trust
## 19210             worse         fear
## 19211             worse     negative
## 19212             worse      sadness
## 19213              calm     positive
## 19214             storm        anger
## 19215             storm     negative
## 19216              time anticipation
## 19217        completely     positive
## 19218          continue anticipation
## 19219          continue     positive
## 19220          continue        trust
## 19221           account        trust
## 19222              rest     positive
## 19223           hearing         fear
## 19224           hearing     negative
## 19225        constantly        trust
## 19226            coming anticipation
## 19227              plan anticipation
## 19228           damages     negative
## 19229           damages      sadness
## 19230             fleet     positive
## 19231               bad        anger
## 19232               bad      disgust
## 19233               bad         fear
## 19234               bad     negative
## 19235               bad      sadness
## 19236               bad        anger
## 19237               bad      disgust
## 19238               bad         fear
## 19239               bad     negative
## 19240               bad      sadness
## 19241          accurate     positive
## 19242          accurate        trust
## 19243            honest        anger
## 19244            honest      disgust
## 19245            honest         fear
## 19246            honest          joy
## 19247            honest     positive
## 19248            honest      sadness
## 19249            honest        trust
## 19250              hate        anger
## 19251              hate      disgust
## 19252              hate         fear
## 19253              hate     negative
## 19254              hate      sadness
## 19255     unprecedented     surprise
## 19256          regulate     positive
## 19257         radiation         fear
## 19258         radiation     negative
## 19259             giant         fear
## 19260             watch anticipation
## 19261             watch         fear
## 19262        scientific     positive
## 19263        scientific        trust
## 19264          decrease     negative
## 19265            damned     negative
## 19266            damned     negative
## 19267            pretty anticipation
## 19268            pretty          joy
## 19269            pretty     positive
## 19270            pretty        trust
## 19271             sweet anticipation
## 19272             sweet          joy
## 19273             sweet     positive
## 19274             sweet     surprise
## 19275             sweet        trust
## 19276              suck     negative
## 19277              food          joy
## 19278              food     positive
## 19279              food        trust
## 19280          scarcity        anger
## 19281          scarcity         fear
## 19282          scarcity     negative
## 19283          scarcity      sadness
## 19284               fun anticipation
## 19285               fun          joy
## 19286               fun     positive
## 19287             elder     positive
## 19288             elder        trust
## 19289               die         fear
## 19290               die     negative
## 19291               die      sadness
## 19292               don     positive
## 19293               don        trust
## 19294              deal anticipation
## 19295              deal          joy
## 19296              deal     positive
## 19297              deal     surprise
## 19298              deal        trust
## 19299               pay anticipation
## 19300               pay          joy
## 19301               pay     positive
## 19302               pay        trust
## 19303       selfishness     negative
## 19304        university anticipation
## 19305        university     positive
## 19306              real     positive
## 19307              real        trust
## 19308             start anticipation
## 19309              damn        anger
## 19310              damn      disgust
## 19311              damn     negative
## 19312            pretty anticipation
## 19313            pretty          joy
## 19314            pretty     positive
## 19315            pretty        trust
## 19316              love          joy
## 19317              love     positive
## 19318            change         fear
## 19319              kick        anger
## 19320              kick     negative
## 19321            scream        anger
## 19322            scream      disgust
## 19323            scream         fear
## 19324            scream     negative
## 19325            scream     surprise
## 19326              wait anticipation
## 19327              wait     negative
## 19328              kick        anger
## 19329              kick     negative
## 19330            demand        anger
## 19331            demand     negative
## 19332              food          joy
## 19333              food     positive
## 19334              food        trust
## 19335        population     positive
## 19336           erosion     negative
## 19337          collapse      disgust
## 19338          collapse         fear
## 19339          collapse     negative
## 19340          collapse      sadness
## 19341              wait anticipation
## 19342              wait     negative
## 19343             digit        trust
## 19344         inflation         fear
## 19345         inflation     negative
## 19346              wait anticipation
## 19347              wait     negative
## 19348            system        trust
## 19349              debt     negative
## 19350              debt      sadness
## 19351              debt     negative
## 19352              debt      sadness
## 19353              plan anticipation
## 19354               pay anticipation
## 19355               pay          joy
## 19356               pay     positive
## 19357               pay        trust
## 19358              debt     negative
## 19359              debt      sadness
## 19360              wait anticipation
## 19361              wait     negative
## 19362             start anticipation
## 19363            cancer        anger
## 19364            cancer      disgust
## 19365            cancer         fear
## 19366            cancer     negative
## 19367            cancer      sadness
## 19368             youth        anger
## 19369             youth anticipation
## 19370             youth         fear
## 19371             youth          joy
## 19372             youth     positive
## 19373             youth     surprise
## 19374              wait anticipation
## 19375              wait     negative
## 19376           gazette     positive
## 19377           gazette        trust
## 19378             onset anticipation
## 19379              wait anticipation
## 19380              wait     negative
## 19381            deadly        anger
## 19382            deadly      disgust
## 19383            deadly         fear
## 19384            deadly     negative
## 19385            deadly      sadness
## 19386           related        trust
## 19387           promise          joy
## 19388           promise     positive
## 19389           promise        trust
## 19390            crisis     negative
## 19391              wait anticipation
## 19392              wait     negative
## 19393            deadly        anger
## 19394            deadly      disgust
## 19395            deadly         fear
## 19396            deadly     negative
## 19397            deadly      sadness
## 19398           related        trust
## 19399           promise          joy
## 19400           promise     positive
## 19401           promise        trust
## 19402              wise     positive
## 19403              deal anticipation
## 19404              deal          joy
## 19405              deal     positive
## 19406              deal     surprise
## 19407              deal        trust
## 19408          exchange     positive
## 19409          exchange        trust
## 19410              rest     positive
## 19411           freedom          joy
## 19412           freedom     positive
## 19413           freedom        trust
## 19414            offset anticipation
## 19415            offset     positive
## 19416              deal anticipation
## 19417              deal          joy
## 19418              deal     positive
## 19419              deal     surprise
## 19420              deal        trust
## 19421             found          joy
## 19422             found     positive
## 19423             found        trust
## 19424              soil      disgust
## 19425              soil     negative
## 19426           erosion     negative
## 19427           erosion     negative
## 19428               top anticipation
## 19429               top     positive
## 19430               top        trust
## 19431              soil      disgust
## 19432              soil     negative
## 19433          continue anticipation
## 19434          continue     positive
## 19435          continue        trust
## 19436           diverse     negative
## 19437           diverse     positive
## 19438       aggravating        anger
## 19439       aggravating     negative
## 19440       aggravating      sadness
## 19441          audacity     negative
## 19442              cash        anger
## 19443              cash anticipation
## 19444              cash         fear
## 19445              cash          joy
## 19446              cash     positive
## 19447              cash        trust
## 19448           harmful        anger
## 19449           harmful      disgust
## 19450           harmful         fear
## 19451           harmful     negative
## 19452           harmful      sadness
## 19453         backwards      disgust
## 19454         backwards     negative
## 19455        government         fear
## 19456        government     negative
## 19457            untrue     negative
## 19458          accounts        trust
## 19459           healthy     positive
## 19460         backwards      disgust
## 19461         backwards     negative
## 19462              calm     positive
## 19463             storm        anger
## 19464             storm     negative
## 19465              lost     negative
## 19466              lost      sadness
## 19467            losing        anger
## 19468            losing     negative
## 19469            losing      sadness
## 19470              time anticipation
## 19471             build     positive
## 19472              time anticipation
## 19473             build     positive
## 19474          almighty     positive
## 19475             build     positive
## 19476             build     positive
## 19477              heal          joy
## 19478              heal     positive
## 19479              heal        trust
## 19480           anxiety        anger
## 19481           anxiety anticipation
## 19482           anxiety         fear
## 19483           anxiety     negative
## 19484           anxiety      sadness
## 19485            reason     positive
## 19486            guilty        anger
## 19487            guilty     negative
## 19488            guilty      sadness
## 19489            friend          joy
## 19490            friend     positive
## 19491            friend        trust
## 19492          daughter          joy
## 19493          daughter     positive
## 19494         professor     positive
## 19495         professor        trust
## 19496        university anticipation
## 19497        university     positive
## 19498            chosen     positive
## 19499            unfair        anger
## 19500            unfair      disgust
## 19501            unfair     negative
## 19502            unfair      sadness
## 19503          collapse      disgust
## 19504          collapse         fear
## 19505          collapse     negative
## 19506          collapse      sadness
## 19507             trump     surprise
## 19508               gut      disgust
## 19509             blame        anger
## 19510             blame      disgust
## 19511             blame     negative
## 19512             moral        anger
## 19513             moral     positive
## 19514             moral        trust
## 19515              time anticipation
## 19516       responsible     positive
## 19517       responsible        trust
## 19518               hit        anger
## 19519               hit     negative
## 19520        hesitation         fear
## 19521        hesitation     negative
## 19522           suspect         fear
## 19523           suspect     negative
## 19524            change         fear
## 19525           anxiety        anger
## 19526           anxiety anticipation
## 19527           anxiety         fear
## 19528           anxiety     negative
## 19529           anxiety      sadness
## 19530          minimize     negative
## 19531           denying anticipation
## 19532           denying     negative
## 19533           anxiety        anger
## 19534           anxiety anticipation
## 19535           anxiety         fear
## 19536           anxiety     negative
## 19537           anxiety      sadness
## 19538            public anticipation
## 19539            public     positive
## 19540           lacking     negative
## 19541       information     positive
## 19542            reason     positive
## 19543          belittle        anger
## 19544          belittle      disgust
## 19545          belittle         fear
## 19546          belittle     negative
## 19547          belittle      sadness
## 19548              late     negative
## 19549              late      sadness
## 19550           anxious anticipation
## 19551           anxious         fear
## 19552           anxious     negative
## 19553            change         fear
## 19554              time anticipation
## 19555             happy anticipation
## 19556             happy          joy
## 19557             happy     positive
## 19558             happy        trust
## 19559              warn anticipation
## 19560              warn         fear
## 19561              warn     negative
## 19562              warn     surprise
## 19563              warn        trust
## 19564              rest     positive
## 19565            change         fear
## 19566        comprehend     positive
## 19567       destruction        anger
## 19568       destruction     negative
## 19569            happen anticipation
## 19570           precise     positive
## 19571          negative     negative
## 19572          negative      sadness
## 19573           urgency anticipation
## 19574           urgency         fear
## 19575           urgency     surprise
## 19576               bad        anger
## 19577               bad      disgust
## 19578               bad         fear
## 19579               bad     negative
## 19580               bad      sadness
## 19581            doomed         fear
## 19582            doomed     negative
## 19583            doomed      sadness
## 19584              ship anticipation
## 19585         skeptical     negative
## 19586        widespread     positive
## 19587         righteous     positive
## 19588         obnoxious        anger
## 19589         obnoxious      disgust
## 19590         obnoxious     negative
## 19591         obnoxious      sadness
## 19592              time anticipation
## 19593               don     positive
## 19594               don        trust
## 19595             doubt         fear
## 19596             doubt     negative
## 19597             doubt      sadness
## 19598             doubt        trust
## 19599               don     positive
## 19600               don        trust
## 19601         concerned         fear
## 19602         concerned      sadness
## 19603        diminished     negative
## 19604           feeling        anger
## 19605           feeling anticipation
## 19606           feeling      disgust
## 19607           feeling         fear
## 19608           feeling          joy
## 19609           feeling     negative
## 19610           feeling     positive
## 19611           feeling      sadness
## 19612           feeling     surprise
## 19613           feeling        trust
## 19614           worried     negative
## 19615           worried      sadness
## 19616              time anticipation
## 19617              copy     negative
## 19618             guess     surprise
## 19619         righteous     positive
## 19620            giving     positive
## 19621              shit        anger
## 19622              shit      disgust
## 19623              shit     negative
## 19624            friend          joy
## 19625            friend     positive
## 19626            friend        trust
## 19627          laughing          joy
## 19628          laughing     positive
## 19629             agree     positive
## 19630             laugh          joy
## 19631             laugh     positive
## 19632             laugh     surprise
## 19633           forward     positive
## 19634             dread anticipation
## 19635             dread         fear
## 19636             dread     negative
## 19637            boring     negative
## 19638            boring     negative
## 19639              bore     negative
## 19640          laughing          joy
## 19641          laughing     positive
## 19642              yawn     negative
## 19643           volcano         fear
## 19644           volcano     negative
## 19645           volcano     surprise
## 19646       magnificent anticipation
## 19647       magnificent          joy
## 19648       magnificent     positive
## 19649       magnificent     surprise
## 19650       magnificent        trust
## 19651           tornado         fear
## 19652             storm        anger
## 19653             storm     negative
## 19654             badly     negative
## 19655             badly      sadness
## 19656              fire         fear
## 19657               bad        anger
## 19658               bad      disgust
## 19659               bad         fear
## 19660               bad     negative
## 19661               bad      sadness
## 19662              haze         fear
## 19663              haze     negative
## 19664             smell        anger
## 19665             smell      disgust
## 19666             smell     negative
## 19667           feeling        anger
## 19668           feeling anticipation
## 19669           feeling      disgust
## 19670           feeling         fear
## 19671           feeling          joy
## 19672           feeling     negative
## 19673           feeling     positive
## 19674           feeling      sadness
## 19675           feeling     surprise
## 19676           feeling        trust
## 19677              pang     negative
## 19678              pang     surprise
## 19679             dread anticipation
## 19680             dread         fear
## 19681             dread     negative
## 19682            change         fear
## 19683             peril anticipation
## 19684             peril         fear
## 19685             peril     negative
## 19686             peril      sadness
## 19687         concerned         fear
## 19688         concerned      sadness
## 19689             force        anger
## 19690             force         fear
## 19691             force     negative
## 19692            change         fear
## 19693              safe          joy
## 19694              safe     positive
## 19695              safe        trust
## 19696              true          joy
## 19697              true     positive
## 19698              true        trust
## 19699              hope anticipation
## 19700              hope          joy
## 19701              hope     positive
## 19702              hope     surprise
## 19703              hope        trust
## 19704             solid     positive
## 19705              plan anticipation
## 19706          ridicule        anger
## 19707          ridicule      disgust
## 19708          ridicule     negative
## 19709          ridicule      sadness
## 19710              save          joy
## 19711              save     positive
## 19712              save        trust
## 19713          humanity          joy
## 19714          humanity     positive
## 19715          humanity        trust
## 19716           anxiety        anger
## 19717           anxiety anticipation
## 19718           anxiety         fear
## 19719           anxiety     negative
## 19720           anxiety      sadness
## 19721               sky     positive
## 19722              fall     negative
## 19723              fall      sadness
## 19724         hyperbole     negative
## 19725           tornado         fear
## 19726           warning         fear
## 19727         confirmed     positive
## 19728         confirmed        trust
## 19729          imminent anticipation
## 19730          imminent         fear
## 19731               sky     positive
## 19732              fall     negative
## 19733              fall      sadness
## 19734         hyperbole     negative
## 19735          horrible        anger
## 19736          horrible      disgust
## 19737          horrible         fear
## 19738          horrible     negative
## 19739            change         fear
## 19740              gain anticipation
## 19741              gain          joy
## 19742              gain     positive
## 19743              seek anticipation
## 19744           shelter     positive
## 19745           shelter        trust
## 19746         dangerous         fear
## 19747         dangerous     negative
## 19748           protect     positive
## 19749           anxiety        anger
## 19750           anxiety anticipation
## 19751           anxiety         fear
## 19752           anxiety     negative
## 19753           anxiety      sadness
## 19754            reason     positive
## 19755              true          joy
## 19756              true     positive
## 19757              true        trust
## 19758              true          joy
## 19759              true     positive
## 19760              true        trust
## 19761            threat        anger
## 19762            threat         fear
## 19763            threat     negative
## 19764              lead     positive
## 19765              time anticipation
## 19766            happen anticipation
## 19767              wait anticipation
## 19768              wait     negative
## 19769            danger         fear
## 19770            danger     negative
## 19771            danger      sadness
## 19772            hidden     negative
## 19773           tornado         fear
## 19774              late     negative
## 19775              late      sadness
## 19776           shelter     positive
## 19777           shelter        trust
## 19778              shit        anger
## 19779              shit      disgust
## 19780              shit     negative
## 19781              time anticipation
## 19782            change         fear
## 19783           tornado         fear
## 19784               ass     negative
## 19785           anxiety        anger
## 19786           anxiety anticipation
## 19787           anxiety         fear
## 19788           anxiety     negative
## 19789           anxiety      sadness
## 19790              risk anticipation
## 19791              risk         fear
## 19792              risk     negative
## 19793            pretty anticipation
## 19794            pretty          joy
## 19795            pretty     positive
## 19796            pretty        trust
## 19797              risk anticipation
## 19798              risk         fear
## 19799              risk     negative
## 19800           tornado         fear
## 19801          credible     positive
## 19802          credible        trust
## 19803            threat        anger
## 19804            threat         fear
## 19805            threat     negative
## 19806               hit        anger
## 19807               hit     negative
## 19808             naive     negative
## 19809         dangerous         fear
## 19810         dangerous     negative
## 19811            action     positive
## 19812          disaster        anger
## 19813          disaster      disgust
## 19814          disaster         fear
## 19815          disaster     negative
## 19816          disaster      sadness
## 19817          disaster     surprise
## 19818           penalty        anger
## 19819           penalty         fear
## 19820           penalty     negative
## 19821           penalty      sadness
## 19822             wrong     negative
## 19823            lethal      disgust
## 19824            lethal         fear
## 19825            lethal     negative
## 19826            lethal      sadness
## 19827         influence     negative
## 19828         influence     positive
## 19829            action     positive
## 19830            ignore     negative
## 19831            threat        anger
## 19832            threat         fear
## 19833            threat     negative
## 19834            pretty anticipation
## 19835            pretty          joy
## 19836            pretty     positive
## 19837            pretty        trust
## 19838             worse         fear
## 19839             worse     negative
## 19840             worse      sadness
## 19841              fire         fear
## 19842             worse         fear
## 19843             worse     negative
## 19844             worse      sadness
## 19845           blinded     negative
## 19846       experienced     positive
## 19847       experienced        trust
## 19848             worse         fear
## 19849             worse     negative
## 19850             worse      sadness
## 19851             daily anticipation
## 19852             trick     negative
## 19853             trick     surprise
## 19854               don     positive
## 19855               don        trust
## 19856              late     negative
## 19857              late      sadness
## 19858             build     positive
## 19859            actual     positive
## 19860               bad        anger
## 19861               bad      disgust
## 19862               bad         fear
## 19863               bad     negative
## 19864               bad      sadness
## 19865               gun        anger
## 19866               gun         fear
## 19867               gun     negative
## 19868              glad anticipation
## 19869              glad          joy
## 19870              glad     positive
## 19871              warn anticipation
## 19872              warn         fear
## 19873              warn     negative
## 19874              warn     surprise
## 19875              warn        trust
## 19876          disaster        anger
## 19877          disaster      disgust
## 19878          disaster         fear
## 19879          disaster     negative
## 19880          disaster      sadness
## 19881          disaster     surprise
## 19882          ultimate anticipation
## 19883          ultimate      sadness
## 19884           tragedy         fear
## 19885           tragedy     negative
## 19886           tragedy      sadness
## 19887            deadly        anger
## 19888            deadly      disgust
## 19889            deadly         fear
## 19890            deadly     negative
## 19891            deadly      sadness
## 19892             storm        anger
## 19893             storm     negative
## 19894           warning         fear
## 19895          complain        anger
## 19896          complain     negative
## 19897          complain      sadness
## 19898           tornado         fear
## 19899           warning         fear
## 19900             radar        trust
## 19901           tornado         fear
## 19902        pedestrian     negative
## 19903           warning         fear
## 19904         knowledge     positive
## 19905       frustration        anger
## 19906       frustration     negative
## 19907            deadly        anger
## 19908            deadly      disgust
## 19909            deadly         fear
## 19910            deadly     negative
## 19911            deadly      sadness
## 19912             storm        anger
## 19913             storm     negative
## 19914          complain        anger
## 19915          complain     negative
## 19916          complain      sadness
## 19917           warning         fear
## 19918          complain        anger
## 19919          complain     negative
## 19920          complain      sadness
## 19921               job     positive
## 19922               bad        anger
## 19923               bad      disgust
## 19924               bad         fear
## 19925               bad     negative
## 19926               bad      sadness
## 19927           feeling        anger
## 19928           feeling anticipation
## 19929           feeling      disgust
## 19930           feeling         fear
## 19931           feeling          joy
## 19932           feeling     negative
## 19933           feeling     positive
## 19934           feeling      sadness
## 19935           feeling     surprise
## 19936           feeling        trust
## 19937            ground        trust
## 19938            change         fear
## 19939               top anticipation
## 19940               top     positive
## 19941               top        trust
## 19942            doomed         fear
## 19943            doomed     negative
## 19944            doomed      sadness
## 19945             happy anticipation
## 19946             happy          joy
## 19947             happy     positive
## 19948             happy        trust
## 19949              hope anticipation
## 19950              hope          joy
## 19951              hope     positive
## 19952              hope     surprise
## 19953              hope        trust
## 19954           forward     positive
## 19955             happy anticipation
## 19956             happy          joy
## 19957             happy     positive
## 19958             happy        trust
## 19959          suddenly     surprise
## 19960              doom         fear
## 19961              doom     negative
## 19962             gloom     negative
## 19963             gloom      sadness
## 19964             focus     positive
## 19965            change         fear
## 19966     unsustainable     negative
## 19967              fear        anger
## 19968              fear         fear
## 19969              fear     negative
## 19970            policy        trust
## 19971            change         fear
## 19972              late     negative
## 19973              late      sadness
## 19974     understanding     positive
## 19975     understanding        trust
## 19976              vote        anger
## 19977              vote anticipation
## 19978              vote          joy
## 19979              vote     negative
## 19980              vote     positive
## 19981              vote      sadness
## 19982              vote     surprise
## 19983              vote        trust
## 19984            policy        trust
## 19985             giant         fear
## 19986           useless     negative
## 19987            change         fear
## 19988              lead     positive
## 19989       inspiration anticipation
## 19990       inspiration          joy
## 19991       inspiration     positive
## 19992            absurd     negative
## 19993         knowledge     positive
## 19994               don     positive
## 19995               don        trust
## 19996            change         fear
## 19997          belittle        anger
## 19998          belittle      disgust
## 19999          belittle         fear
## 20000          belittle     negative
## 20001          belittle      sadness
## 20002          critique     positive
## 20003             laugh          joy
## 20004             laugh     positive
## 20005             laugh     surprise
## 20006             argue        anger
## 20007             argue     negative
## 20008             swear     positive
## 20009             swear        trust
## 20010          tomorrow anticipation
## 20011              harm         fear
## 20012              harm     negative
## 20013         apathetic     negative
## 20014         apathetic      sadness
## 20015              deny        anger
## 20016              deny     negative
## 20017            change         fear
## 20018          planning anticipation
## 20019          planning     positive
## 20020          planning        trust
## 20021            giving     positive
## 20022             weird      disgust
## 20023             weird     negative
## 20024              deny        anger
## 20025              deny     negative
## 20026            change         fear
## 20027           idiotic        anger
## 20028           idiotic      disgust
## 20029           idiotic     negative
## 20030             dying        anger
## 20031             dying      disgust
## 20032             dying         fear
## 20033             dying     negative
## 20034             dying      sadness
## 20035            change         fear
## 20036         community     positive
## 20037        scientific     positive
## 20038        scientific        trust
## 20039         screaming        anger
## 20040         screaming      disgust
## 20041         screaming         fear
## 20042         screaming     negative
## 20043            reason     positive
## 20044            apathy     negative
## 20045            apathy      sadness
## 20046            actual     positive
## 20047             agree     positive
## 20048            coming anticipation
## 20049             weird      disgust
## 20050             weird     negative
## 20051            change         fear
## 20052           idiotic        anger
## 20053           idiotic      disgust
## 20054           idiotic     negative
## 20055       destructive        anger
## 20056       destructive      disgust
## 20057       destructive         fear
## 20058       destructive     negative
## 20059              talk     positive
## 20060          solution     positive
## 20061         lamenting      sadness
## 20062             worse         fear
## 20063             worse     negative
## 20064             worse      sadness
## 20065          friendly anticipation
## 20066          friendly          joy
## 20067          friendly     positive
## 20068          friendly        trust
## 20069       speculative anticipation
## 20070            change         fear
## 20071              wild     negative
## 20072              wild     surprise
## 20073              cute     positive
## 20074              plan anticipation
## 20075         statement     positive
## 20076         statement        trust
## 20077             wrong     negative
## 20078         apathetic     negative
## 20079         apathetic      sadness
## 20080            change         fear
## 20081               ass     negative
## 20082              join     positive
## 20083              join     positive
## 20084             honey     positive
## 20085            change         fear
## 20086               bad        anger
## 20087               bad      disgust
## 20088               bad         fear
## 20089               bad     negative
## 20090               bad      sadness
## 20091             honey     positive
## 20092               sky     positive
## 20093               don     positive
## 20094               don        trust
## 20095              shit        anger
## 20096              shit      disgust
## 20097              shit     negative
## 20098               don     positive
## 20099               don        trust
## 20100               bad        anger
## 20101               bad      disgust
## 20102               bad         fear
## 20103               bad     negative
## 20104               bad      sadness
## 20105             vague     negative
## 20106           explain     positive
## 20107           explain        trust
## 20108             honey     positive
## 20109         scientist anticipation
## 20110         scientist     positive
## 20111         scientist        trust
## 20112            rising anticipation
## 20113            rising          joy
## 20114            rising     positive
## 20115       threatening        anger
## 20116       threatening      disgust
## 20117       threatening         fear
## 20118       threatening     negative
## 20119              calm     positive
## 20120           symptom     negative
## 20121         apathetic     negative
## 20122         apathetic      sadness
## 20123               bad        anger
## 20124               bad      disgust
## 20125               bad         fear
## 20126               bad     negative
## 20127               bad      sadness
## 20128            denial     negative
## 20129               bad        anger
## 20130               bad      disgust
## 20131               bad         fear
## 20132               bad     negative
## 20133               bad      sadness
## 20134               tax     negative
## 20135               tax      sadness
## 20136              hell        anger
## 20137              hell      disgust
## 20138              hell         fear
## 20139              hell     negative
## 20140              hell      sadness
## 20141        production anticipation
## 20142        production     positive
## 20143            create          joy
## 20144            create     positive
## 20145            change         fear
## 20146             proof        trust
## 20147            change         fear
## 20148             blame        anger
## 20149             blame      disgust
## 20150             blame     negative
## 20151             found          joy
## 20152             found     positive
## 20153             found        trust
## 20154            solace     positive
## 20155           anxiety        anger
## 20156           anxiety anticipation
## 20157           anxiety         fear
## 20158           anxiety     negative
## 20159           anxiety      sadness
## 20160          solution     positive
## 20161            school        trust
## 20162          fighting        anger
## 20163          fighting     negative
## 20164       distraction     negative
## 20165        solidarity        trust
## 20166            change         fear
## 20167             honey     positive
## 20168              glad anticipation
## 20169              glad          joy
## 20170              glad     positive
## 20171           reading     positive
## 20172              suck     negative
## 20173               don     positive
## 20174               don        trust
## 20175              join     positive
## 20176          negative     negative
## 20177          negative      sadness
## 20178              join     positive
## 20179            giving     positive
## 20180              calm     positive
## 20181        scientific     positive
## 20182        scientific        trust
## 20183              join     positive
## 20184           urgency anticipation
## 20185           urgency         fear
## 20186           urgency     surprise
## 20187            joined     positive
## 20188        compelling     positive
## 20189          offering        trust
## 20190         inclusive     positive
## 20191         effective     positive
## 20192         effective        trust
## 20193            action     positive
## 20194               don     positive
## 20195               don        trust
## 20196             worse         fear
## 20197             worse     negative
## 20198             worse      sadness
## 20199            happen anticipation
## 20200               bad        anger
## 20201               bad      disgust
## 20202               bad         fear
## 20203               bad     negative
## 20204               bad      sadness
## 20205           anxious anticipation
## 20206           anxious         fear
## 20207           anxious     negative
## 20208         excitable     positive
## 20209         resilient     positive
## 20210          majority          joy
## 20211          majority     positive
## 20212          majority        trust
## 20213           tornado         fear
## 20214             start anticipation
## 20215            pretty anticipation
## 20216            pretty          joy
## 20217            pretty     positive
## 20218            pretty        trust
## 20219            ground        trust
## 20220             begun anticipation
## 20221             force        anger
## 20222             force         fear
## 20223             force     negative
## 20224       responsible     positive
## 20225       responsible        trust
## 20226            change         fear
## 20227            change         fear
## 20228              luck anticipation
## 20229              luck          joy
## 20230              luck     positive
## 20231              luck     surprise
## 20232          neighbor anticipation
## 20233          neighbor     positive
## 20234          neighbor        trust
## 20235               pay anticipation
## 20236               pay          joy
## 20237               pay     positive
## 20238               pay        trust
## 20239         attention     positive
## 20240              fire         fear
## 20241              vote        anger
## 20242              vote anticipation
## 20243              vote          joy
## 20244              vote     negative
## 20245              vote     positive
## 20246              vote      sadness
## 20247              vote     surprise
## 20248              vote        trust
## 20249          advocate        trust
## 20250            change         fear
## 20251             model     positive
## 20252             dread anticipation
## 20253             dread         fear
## 20254             dread     negative
## 20255         resentful        anger
## 20256         resentful     negative
## 20257              talk     positive
## 20258             fluke     surprise
## 20259          majority          joy
## 20260          majority     positive
## 20261          majority        trust
## 20262              late     negative
## 20263              late      sadness
## 20264          minimize     negative
## 20265       destruction        anger
## 20266       destruction     negative
## 20267          personal        trust
## 20268           feeling        anger
## 20269           feeling anticipation
## 20270           feeling      disgust
## 20271           feeling         fear
## 20272           feeling          joy
## 20273           feeling     negative
## 20274           feeling     positive
## 20275           feeling      sadness
## 20276           feeling     surprise
## 20277           feeling        trust
## 20278               bad        anger
## 20279               bad      disgust
## 20280               bad         fear
## 20281               bad     negative
## 20282               bad      sadness
## 20283            happen anticipation
## 20284       inheritance anticipation
## 20285       inheritance          joy
## 20286       inheritance     positive
## 20287       inheritance     surprise
## 20288       inheritance        trust
## 20289              hell        anger
## 20290              hell      disgust
## 20291              hell         fear
## 20292              hell     negative
## 20293              hell      sadness
## 20294              rest     positive
## 20295             elder     positive
## 20296             elder        trust
## 20297             laugh          joy
## 20298             laugh     positive
## 20299             laugh     surprise
## 20300            excuse     negative
## 20301              true          joy
## 20302              true     positive
## 20303              true        trust
## 20304              doom         fear
## 20305              doom     negative
## 20306     disheartening     negative
## 20307     disheartening      sadness
## 20308          shopping anticipation
## 20309          shopping          joy
## 20310          shopping     positive
## 20311          shopping     surprise
## 20312          shopping        trust
## 20313       responsible     positive
## 20314       responsible        trust
## 20315          friendly anticipation
## 20316          friendly          joy
## 20317          friendly     positive
## 20318          friendly        trust
## 20319            poison        anger
## 20320            poison      disgust
## 20321            poison         fear
## 20322            poison     negative
## 20323            poison      sadness
## 20324          suddenly     surprise
## 20325          personal        trust
## 20326            afford     positive
## 20327            luxury          joy
## 20328            luxury     positive
## 20329           educate     positive
## 20330               pay anticipation
## 20331               pay          joy
## 20332               pay     positive
## 20333               pay        trust
## 20334            public anticipation
## 20335            public     positive
## 20336            supply     positive
## 20337         destroyed        anger
## 20338         destroyed         fear
## 20339         destroyed     negative
## 20340         destroyed      sadness
## 20341              deal anticipation
## 20342              deal          joy
## 20343              deal     positive
## 20344              deal     surprise
## 20345              deal        trust
## 20346            change         fear
## 20347        production anticipation
## 20348        production     positive
## 20349          building     positive
## 20350              food          joy
## 20351              food     positive
## 20352              food        trust
## 20353           poverty        anger
## 20354           poverty      disgust
## 20355           poverty         fear
## 20356           poverty     negative
## 20357           poverty      sadness
## 20358            actual     positive
## 20359          vacation anticipation
## 20360          vacation          joy
## 20361          vacation     positive
## 20362             money        anger
## 20363             money anticipation
## 20364             money          joy
## 20365             money     positive
## 20366             money     surprise
## 20367             money        trust
## 20368       responsible     positive
## 20369       responsible        trust
## 20370        surprising     surprise
## 20371           tornado         fear
## 20372              true          joy
## 20373              true     positive
## 20374              true        trust
## 20375             watch anticipation
## 20376             watch         fear
## 20377           warning         fear
## 20378              real     positive
## 20379              real        trust
## 20380             watch anticipation
## 20381             watch         fear
## 20382           tornado         fear
## 20383           warning         fear
## 20384          credible     positive
## 20385          credible        trust
## 20386           tornado         fear
## 20387           forming anticipation
## 20388             radar        trust
## 20389         confirmed     positive
## 20390         confirmed        trust
## 20391        eyewitness        trust
## 20392           warning         fear
## 20393             radar        trust
## 20394         confirmed     positive
## 20395         confirmed        trust
## 20396              love          joy
## 20397              love     positive
## 20398             learn     positive
## 20399            alerts anticipation
## 20400            alerts         fear
## 20401            alerts     surprise
## 20402             catch     surprise
## 20403           special          joy
## 20404           special     positive
## 20405            alerts anticipation
## 20406            alerts         fear
## 20407            alerts     surprise
## 20408           special          joy
## 20409           special     positive
## 20410           network anticipation
## 20411       approaching anticipation
## 20412             storm        anger
## 20413             storm     negative
## 20414             storm        anger
## 20415             storm     negative
## 20416           ominous anticipation
## 20417           ominous         fear
## 20418           ominous     negative
## 20419            ground        trust
## 20420              fear        anger
## 20421              fear         fear
## 20422              fear     negative
## 20423            change         fear
## 20424            change         fear
## 20425         dependent     negative
## 20426         dependent     positive
## 20427         dependent        trust
## 20428             quiet     positive
## 20429             quiet      sadness
## 20430              grow anticipation
## 20431              grow          joy
## 20432              grow     positive
## 20433              grow        trust
## 20434              save          joy
## 20435              save     positive
## 20436              save        trust
## 20437             money        anger
## 20438             money anticipation
## 20439             money          joy
## 20440             money     positive
## 20441             money     surprise
## 20442             money        trust
## 20443             lucky          joy
## 20444             lucky     positive
## 20445             lucky     surprise
## 20446              land     positive
## 20447          progress anticipation
## 20448          progress          joy
## 20449          progress     positive
## 20450            change         fear
## 20451            change         fear
## 20452           crusade        anger
## 20453           crusade         fear
## 20454           crusade     negative
## 20455             agree     positive
## 20456         community     positive
## 20457        dependence         fear
## 20458        dependence     negative
## 20459        dependence      sadness
## 20460            income anticipation
## 20461            income          joy
## 20462            income     negative
## 20463            income     positive
## 20464            income      sadness
## 20465            income        trust
## 20466              lost     negative
## 20467              lost      sadness
## 20468              glad anticipation
## 20469              glad          joy
## 20470              glad     positive
## 20471             waste      disgust
## 20472             waste     negative
## 20473              food          joy
## 20474              food     positive
## 20475              food        trust
## 20476              rest     positive
## 20477          learning     positive
## 20478            change         fear
## 20479           pollute      disgust
## 20480           pollute     negative
## 20481            scheme     negative
## 20482           benefit     positive
## 20483            change         fear
## 20484          ignorant      disgust
## 20485          ignorant     negative
## 20486             force        anger
## 20487             force         fear
## 20488             force     negative
## 20489            manage     positive
## 20490            manage        trust
## 20491          solution     positive
## 20492            change         fear
## 20493             money        anger
## 20494             money anticipation
## 20495             money          joy
## 20496             money     positive
## 20497             money     surprise
## 20498             money        trust
## 20499             guess     surprise
## 20500            mother anticipation
## 20501            mother          joy
## 20502            mother     negative
## 20503            mother     positive
## 20504            mother      sadness
## 20505            mother        trust
## 20506              beer          joy
## 20507              beer     positive
## 20508          forecast anticipation
## 20509          forecast        trust
## 20510            pretty anticipation
## 20511            pretty          joy
## 20512            pretty     positive
## 20513            pretty        trust
## 20514              grim        anger
## 20515              grim anticipation
## 20516              grim      disgust
## 20517              grim         fear
## 20518              grim     negative
## 20519              grim      sadness
## 20520             fight        anger
## 20521             fight         fear
## 20522             fight     negative
## 20523             worry anticipation
## 20524             worry         fear
## 20525             worry     negative
## 20526             worry      sadness
## 20527              hope anticipation
## 20528              hope          joy
## 20529              hope     positive
## 20530              hope     surprise
## 20531              hope        trust
## 20532            degree     positive
## 20533            change         fear
## 20534             force        anger
## 20535             force         fear
## 20536             force     negative
## 20537            change         fear
## 20538            denial     negative
## 20539            agreed     positive
## 20540            agreed        trust
## 20541              safe          joy
## 20542              safe     positive
## 20543              safe        trust
## 20544           anxiety        anger
## 20545           anxiety anticipation
## 20546           anxiety         fear
## 20547           anxiety     negative
## 20548           anxiety      sadness
## 20549           shelter     positive
## 20550           shelter        trust
## 20551              fort        trust
## 20552            bother     negative
## 20553              love          joy
## 20554              love     positive
## 20555              fire         fear
## 20556              time anticipation
## 20557             lucky          joy
## 20558             lucky     positive
## 20559             lucky     surprise
## 20560        contribute     positive
## 20561         including     positive
## 20562             slave        anger
## 20563             slave         fear
## 20564             slave     negative
## 20565             slave      sadness
## 20566            policy        trust
## 20567        constantly        trust
## 20568               bad        anger
## 20569               bad      disgust
## 20570               bad         fear
## 20571               bad     negative
## 20572               bad      sadness
## 20573             worth     positive
## 20574         encourage          joy
## 20575         encourage     positive
## 20576         encourage        trust
## 20577              true          joy
## 20578              true     positive
## 20579              true        trust
## 20580          shortage        anger
## 20581          shortage         fear
## 20582          shortage     negative
## 20583          shortage      sadness
## 20584              late     negative
## 20585              late      sadness
## 20586      overwhelming     positive
## 20587              time anticipation
## 20588           limited        anger
## 20589           limited     negative
## 20590           limited      sadness
## 20591            result anticipation
## 20592            action     positive
## 20593             trend     positive
## 20594             enjoy anticipation
## 20595             enjoy          joy
## 20596             enjoy     positive
## 20597             enjoy        trust
## 20598          shortage        anger
## 20599          shortage         fear
## 20600          shortage     negative
## 20601          shortage      sadness
## 20602            action     positive
## 20603            change         fear
## 20604             worth     positive
## 20605             mayor     positive
## 20606            change         fear
## 20607          negative     negative
## 20608          negative      sadness
## 20609           tornado         fear
## 20610           touched     negative
## 20611              risk anticipation
## 20612              risk         fear
## 20613              risk     negative
## 20614         emergency         fear
## 20615         emergency     negative
## 20616         emergency      sadness
## 20617         emergency     surprise
## 20618           anxious anticipation
## 20619           anxious         fear
## 20620           anxious     negative
## 20621           anxious anticipation
## 20622           anxious         fear
## 20623           anxious     negative
## 20624              crap      disgust
## 20625              crap     negative
## 20626             build     positive
## 20627           warrior        anger
## 20628           warrior         fear
## 20629           warrior     positive
## 20630             death        anger
## 20631             death anticipation
## 20632             death      disgust
## 20633             death         fear
## 20634             death     negative
## 20635             death      sadness
## 20636             death     surprise
## 20637          progress anticipation
## 20638          progress          joy
## 20639          progress     positive
## 20640           feeling        anger
## 20641           feeling anticipation
## 20642           feeling      disgust
## 20643           feeling         fear
## 20644           feeling          joy
## 20645           feeling     negative
## 20646           feeling     positive
## 20647           feeling      sadness
## 20648           feeling     surprise
## 20649           feeling        trust
## 20650             worth     positive
## 20651          worrying anticipation
## 20652          worrying         fear
## 20653          worrying     negative
## 20654          worrying      sadness
## 20655             worry anticipation
## 20656             worry         fear
## 20657             worry     negative
## 20658             worry      sadness
## 20659           caution        anger
## 20660           caution anticipation
## 20661           caution         fear
## 20662           caution     negative
## 20663            losing        anger
## 20664            losing     negative
## 20665            losing      sadness
## 20666           nervous anticipation
## 20667           nervous         fear
## 20668           nervous     negative
## 20669             wreck        anger
## 20670             wreck      disgust
## 20671             wreck         fear
## 20672             wreck     negative
## 20673             wreck      sadness
## 20674             wreck     surprise
## 20675           anxiety        anger
## 20676           anxiety anticipation
## 20677           anxiety         fear
## 20678           anxiety     negative
## 20679           anxiety      sadness
## 20680        productive     positive
## 20681             green          joy
## 20682             green     positive
## 20683             green        trust
## 20684           embrace anticipation
## 20685           embrace          joy
## 20686           embrace     positive
## 20687           embrace     surprise
## 20688           embrace        trust
## 20689             seize         fear
## 20690             seize     negative
## 20691              time anticipation
## 20692          nihilism     negative
## 20693            remedy anticipation
## 20694            remedy          joy
## 20695            remedy     positive
## 20696            remedy        trust
## 20697               don     positive
## 20698               don        trust
## 20699             blame        anger
## 20700             blame      disgust
## 20701             blame     negative
## 20702            change         fear
## 20703            change         fear
## 20704              grow anticipation
## 20705              grow          joy
## 20706              grow     positive
## 20707              grow        trust
## 20708          solution     positive
## 20709          grounded         fear
## 20710          grounded     negative
## 20711          grounded      sadness
## 20712          nihilism     negative
## 20713              time anticipation
## 20714        government         fear
## 20715        government     negative
## 20716            public anticipation
## 20717            public     positive
## 20718           servant     negative
## 20719           servant        trust
## 20720          nihilism     negative
## 20721             found          joy
## 20722             found     positive
## 20723             found        trust
## 20724        government         fear
## 20725        government     negative
## 20726             sense     positive
## 20727        passionate anticipation
## 20728        passionate          joy
## 20729        passionate     positive
## 20730        passionate        trust
## 20731           warrior        anger
## 20732           warrior         fear
## 20733           warrior     positive
## 20734           memento     positive
## 20735             death        anger
## 20736             death anticipation
## 20737             death      disgust
## 20738             death         fear
## 20739             death     negative
## 20740             death      sadness
## 20741             death     surprise
## 20742          worrying anticipation
## 20743          worrying         fear
## 20744          worrying     negative
## 20745          worrying      sadness
## 20746           ability     positive
## 20747             enjoy anticipation
## 20748             enjoy          joy
## 20749             enjoy     positive
## 20750             enjoy        trust
## 20751          powerful        anger
## 20752          powerful anticipation
## 20753          powerful      disgust
## 20754          powerful         fear
## 20755          powerful          joy
## 20756          powerful     positive
## 20757          powerful        trust
## 20758         beautiful          joy
## 20759         beautiful     positive
## 20760            decent     positive
## 20761          nihilism     negative
## 20762              evil        anger
## 20763              evil      disgust
## 20764              evil         fear
## 20765              evil     negative
## 20766              evil      sadness
## 20767            weight anticipation
## 20768            weight      disgust
## 20769            weight         fear
## 20770            weight          joy
## 20771            weight     negative
## 20772            weight     positive
## 20773            weight      sadness
## 20774            weight     surprise
## 20775            weight        trust
## 20776          crippled     negative
## 20777          crippled      sadness
## 20778           anxiety        anger
## 20779           anxiety anticipation
## 20780           anxiety         fear
## 20781           anxiety     negative
## 20782           anxiety      sadness
## 20783           citizen     positive
## 20784              blue      sadness
## 20785              star anticipation
## 20786              star          joy
## 20787              star     positive
## 20788              star        trust
## 20789              cage     negative
## 20790              cage      sadness
## 20791            hungry anticipation
## 20792            hungry     negative
## 20793              food          joy
## 20794              food     positive
## 20795              food        trust
## 20796            honest        anger
## 20797            honest      disgust
## 20798            honest         fear
## 20799            honest          joy
## 20800            honest     positive
## 20801            honest      sadness
## 20802            honest        trust
## 20803            suffer     negative
## 20804         statement     positive
## 20805         statement        trust
## 20806              time anticipation
## 20807         surprised     surprise
## 20808           warning         fear
## 20809           shelter     positive
## 20810           shelter        trust
## 20811           warning         fear
## 20812              time anticipation
## 20813             usual     positive
## 20814             usual        trust
## 20815           anxiety        anger
## 20816           anxiety anticipation
## 20817           anxiety         fear
## 20818           anxiety     negative
## 20819           anxiety      sadness
## 20820           anxiety        anger
## 20821           anxiety anticipation
## 20822           anxiety         fear
## 20823           anxiety     negative
## 20824           anxiety      sadness
## 20825           anxiety        anger
## 20826           anxiety anticipation
## 20827           anxiety         fear
## 20828           anxiety     negative
## 20829           anxiety      sadness
## 20830            brains     positive
## 20831              time anticipation
## 20832             awful        anger
## 20833             awful      disgust
## 20834             awful         fear
## 20835             awful     negative
## 20836             awful      sadness
## 20837            center     positive
## 20838            center        trust
## 20839             focus     positive
## 20840              rest     positive
## 20841              fear        anger
## 20842              fear         fear
## 20843              fear     negative
## 20844              fear        anger
## 20845              fear         fear
## 20846              fear     negative
## 20847              fear        anger
## 20848              fear         fear
## 20849              fear     negative
## 20850             spent     negative
## 20851          friendly anticipation
## 20852          friendly          joy
## 20853          friendly     positive
## 20854          friendly        trust
## 20855             spent     negative
## 20856            losing        anger
## 20857            losing     negative
## 20858            losing      sadness
## 20859              shit        anger
## 20860              shit      disgust
## 20861              shit     negative
## 20862             worse         fear
## 20863             worse     negative
## 20864             worse      sadness
## 20865              time anticipation
## 20866              hell        anger
## 20867              hell      disgust
## 20868              hell         fear
## 20869              hell     negative
## 20870              hell      sadness
## 20871              late     negative
## 20872              late      sadness
## 20873        completely     positive
## 20874              shit        anger
## 20875              shit      disgust
## 20876              shit     negative
## 20877              real     positive
## 20878              real        trust
## 20879       intelligent     positive
## 20880       intelligent        trust
## 20881              shit        anger
## 20882              shit      disgust
## 20883              shit     negative
## 20884             trump     surprise
## 20885           winning anticipation
## 20886           winning      disgust
## 20887           winning          joy
## 20888           winning     positive
## 20889           winning      sadness
## 20890           winning     surprise
## 20891           winning        trust
## 20892              shit        anger
## 20893              shit      disgust
## 20894              shit     negative
## 20895              main     positive
## 20896            chance     surprise
## 20897             dying        anger
## 20898             dying      disgust
## 20899             dying         fear
## 20900             dying     negative
## 20901             dying      sadness
## 20902            center     positive
## 20903            center        trust
## 20904            stupid     negative
## 20905              numb     negative
## 20906            change         fear
## 20907           drought     negative
## 20908             flood         fear
## 20909           tornado         fear
## 20910             giant         fear
## 20911              hail     negative
## 20912              hail     positive
## 20913              hail        trust
## 20914           tornado         fear
## 20915              wait anticipation
## 20916              wait     negative
## 20917             crazy        anger
## 20918             crazy         fear
## 20919             crazy     negative
## 20920             crazy      sadness
## 20921        destroying        anger
## 20922        destroying         fear
## 20923        destroying     negative
## 20924        destroying      sadness
## 20925             cover        trust
## 20926          collapse      disgust
## 20927          collapse         fear
## 20928          collapse     negative
## 20929          collapse      sadness
## 20930            alerts anticipation
## 20931            alerts         fear
## 20932            alerts     surprise
## 20933            larger      disgust
## 20934            larger     surprise
## 20935            larger        trust
## 20936           prepare anticipation
## 20937           prepare     positive
## 20938         recommend     positive
## 20939         recommend        trust
## 20940             watch anticipation
## 20941             watch         fear
## 20942            change         fear
## 20943               don     positive
## 20944               don        trust
## 20945             blame        anger
## 20946             blame      disgust
## 20947             blame     negative
## 20948            change         fear
## 20949               lie        anger
## 20950               lie      disgust
## 20951               lie     negative
## 20952               lie      sadness
## 20953            change         fear
## 20954            supply     positive
## 20955          inaction     negative
## 20956          electric          joy
## 20957          electric     positive
## 20958          electric     surprise
## 20959            create          joy
## 20960            create     positive
## 20961              fake     negative
## 20962           culture     positive
## 20963           confuse     negative
## 20964      manipulation        anger
## 20965      manipulation         fear
## 20966      manipulation     negative
## 20967              real     positive
## 20968              real        trust
## 20969              seek anticipation
## 20970     understanding     positive
## 20971     understanding        trust
## 20972              vote        anger
## 20973              vote anticipation
## 20974              vote          joy
## 20975              vote     negative
## 20976              vote     positive
## 20977              vote      sadness
## 20978              vote     surprise
## 20979              vote        trust
## 20980            create          joy
## 20981            create     positive
## 20982            change         fear
## 20983             blame        anger
## 20984             blame      disgust
## 20985             blame     negative
## 20986           knowing     positive
## 20987           knowing     positive
## 20988             worth     positive
## 20989           knowing     positive
## 20990            reason     positive
## 20991        inequality        anger
## 20992        inequality         fear
## 20993        inequality     negative
## 20994        inequality      sadness
## 20995             green          joy
## 20996             green     positive
## 20997             green        trust
## 20998             horse        trust
## 20999           advance anticipation
## 21000           advance         fear
## 21001           advance          joy
## 21002           advance     positive
## 21003           advance     surprise
## 21004           foolish     negative
## 21005          childish     negative
## 21006          cracking     negative
## 21007           prevent         fear
## 21008            change         fear
## 21009            chosen     positive
## 21010             green          joy
## 21011             green     positive
## 21012             green        trust
## 21013           advance anticipation
## 21014           advance         fear
## 21015           advance          joy
## 21016           advance     positive
## 21017           advance     surprise
## 21018           envious     negative
## 21019          practice     positive
## 21020           isolate      sadness
## 21021            happen anticipation
## 21022            actual     positive
## 21023            combat        anger
## 21024            combat         fear
## 21025            combat     negative
## 21026           readily     positive
## 21027            change         fear
## 21028           include     positive
## 21029             smell        anger
## 21030             smell      disgust
## 21031             smell     negative
## 21032               job     positive
## 21033           ominous anticipation
## 21034           ominous         fear
## 21035           ominous     negative
## 21036             worse         fear
## 21037             worse     negative
## 21038             worse      sadness
## 21039           foolish     negative
## 21040            change         fear
## 21041            fairly     positive
## 21042            fairly        trust
## 21043           tornado         fear
## 21044           precede     positive
## 21045           tornado         fear
## 21046           warning         fear
## 21047            expect anticipation
## 21048            expect     positive
## 21049            expect     surprise
## 21050            expect        trust
## 21051       devastating        anger
## 21052       devastating      disgust
## 21053       devastating         fear
## 21054       devastating     negative
## 21055       devastating      sadness
## 21056       devastating        trust
## 21057           cyclone         fear
## 21058           cyclone     negative
## 21059           cyclone     surprise
## 21060          constant     positive
## 21061          constant        trust
## 21062              hate        anger
## 21063              hate      disgust
## 21064              hate         fear
## 21065              hate     negative
## 21066              hate      sadness
## 21067            change         fear
## 21068             worry anticipation
## 21069             worry         fear
## 21070             worry     negative
## 21071             worry      sadness
## 21072              pill     positive
## 21073              pill        trust
## 21074           delight anticipation
## 21075           delight          joy
## 21076           delight     positive
## 21077         destroyed        anger
## 21078         destroyed         fear
## 21079         destroyed     negative
## 21080         destroyed      sadness
## 21081          classify     positive
## 21082            degree     positive
## 21083              hell        anger
## 21084              hell      disgust
## 21085              hell         fear
## 21086              hell     negative
## 21087              hell      sadness
## 21088           fearing         fear
## 21089           fearing     negative
## 21090            actual     positive
## 21091          disaster        anger
## 21092          disaster      disgust
## 21093          disaster         fear
## 21094          disaster     negative
## 21095          disaster      sadness
## 21096          disaster     surprise
## 21097             worse         fear
## 21098             worse     negative
## 21099             worse      sadness
## 21100             agree     positive
## 21101            change         fear
## 21102              time anticipation
## 21103            happen anticipation
## 21104             force        anger
## 21105             force         fear
## 21106             force     negative
## 21107           prolong      disgust
## 21108           prolong     negative
## 21109             force        anger
## 21110             force         fear
## 21111             force     negative
## 21112           prolong      disgust
## 21113           prolong     negative
## 21114               don     positive
## 21115               don        trust
## 21116            wisdom     positive
## 21117            wisdom        trust
## 21118             guess     surprise
## 21119            forced         fear
## 21120            forced     negative
## 21121            change         fear
## 21122              love          joy
## 21123              love     positive
## 21124            public anticipation
## 21125            public     positive
## 21126          wasteful        anger
## 21127          wasteful      disgust
## 21128          wasteful     negative
## 21129          wasteful      sadness
## 21130               don     positive
## 21131               don        trust
## 21132          negative     negative
## 21133          negative      sadness
## 21134          punitive        anger
## 21135          punitive         fear
## 21136          punitive     negative
## 21137          punitive      sadness
## 21138            chance     surprise
## 21139               don     positive
## 21140               don        trust
## 21141              hurt        anger
## 21142              hurt         fear
## 21143              hurt     negative
## 21144              hurt      sadness
## 21145              hope anticipation
## 21146              hope          joy
## 21147              hope     positive
## 21148              hope     surprise
## 21149              hope        trust
## 21150               don     positive
## 21151               don        trust
## 21152              time anticipation
## 21153          convince anticipation
## 21154          convince     positive
## 21155          convince        trust
## 21156         agreement     positive
## 21157         agreement        trust
## 21158             pivot     positive
## 21159             pivot        trust
## 21160          sinister        anger
## 21161          sinister      disgust
## 21162          sinister         fear
## 21163          sinister     negative
## 21164        conspiracy         fear
## 21165          obstruct        anger
## 21166          obstruct         fear
## 21167          obstruct     negative
## 21168          progress anticipation
## 21169          progress          joy
## 21170          progress     positive
## 21171           mistake     negative
## 21172           mistake      sadness
## 21173            public anticipation
## 21174            public     positive
## 21175             moron     negative
## 21176           asshole        anger
## 21177           asshole      disgust
## 21178           asshole     negative
## 21179               pay anticipation
## 21180               pay          joy
## 21181               pay     positive
## 21182               pay        trust
## 21183            income anticipation
## 21184            income          joy
## 21185            income     negative
## 21186            income     positive
## 21187            income      sadness
## 21188            income        trust
## 21189               tax     negative
## 21190               tax      sadness
## 21191           tornado         fear
## 21192             lower     negative
## 21193             lower      sadness
## 21194        government         fear
## 21195        government     negative
## 21196           tornado         fear
## 21197           tornado         fear
## 21198             radar        trust
## 21199        population     positive
## 21200            steady     surprise
## 21201            steady        trust
## 21202          decrease     negative
## 21203              time anticipation
## 21204               god anticipation
## 21205               god         fear
## 21206               god          joy
## 21207               god     positive
## 21208               god        trust
## 21209             happy anticipation
## 21210             happy          joy
## 21211             happy     positive
## 21212             happy        trust
## 21213            friend          joy
## 21214            friend     positive
## 21215            friend        trust
## 21216             worse         fear
## 21217             worse     negative
## 21218             worse      sadness
## 21219        propaganda     negative
## 21220              plan anticipation
## 21221             weird      disgust
## 21222             weird     negative
## 21223             cover        trust
## 21224             scare        anger
## 21225             scare anticipation
## 21226             scare         fear
## 21227             scare     negative
## 21228             scare     surprise
## 21229            subdue     negative
## 21230             learn     positive
## 21231              main     positive
## 21232              cold     negative
## 21233           helpful          joy
## 21234           helpful     positive
## 21235           helpful        trust
## 21236            fleece        anger
## 21237            fleece      disgust
## 21238            fleece     negative
## 21239            fleece      sadness
## 21240            advice        trust
## 21241            reason     positive
## 21242        stereotype     negative
## 21243              glad anticipation
## 21244              glad          joy
## 21245              glad     positive
## 21246              hate        anger
## 21247              hate      disgust
## 21248              hate         fear
## 21249              hate     negative
## 21250              hate      sadness
## 21251              wear     negative
## 21252              wear        trust
## 21253              hate        anger
## 21254              hate      disgust
## 21255              hate         fear
## 21256              hate     negative
## 21257              hate      sadness
## 21258              lost     negative
## 21259              lost      sadness
## 21260               zip     negative
## 21261            chance     surprise
## 21262             model     positive
## 21263        recreation anticipation
## 21264        recreation          joy
## 21265        recreation     positive
## 21266             model     positive
## 21267           visitor anticipation
## 21268           visitor          joy
## 21269           visitor     positive
## 21270            center     positive
## 21271            center        trust
## 21272            police         fear
## 21273            police     positive
## 21274            police        trust
## 21275              hate        anger
## 21276              hate      disgust
## 21277              hate         fear
## 21278              hate     negative
## 21279              hate      sadness
## 21280             model     positive
## 21281              cool     positive
## 21282            pretty anticipation
## 21283            pretty          joy
## 21284            pretty     positive
## 21285            pretty        trust
## 21286            reason     positive
## 21287             visit     positive
## 21288          freezing     negative
## 21289           knowing     positive
## 21290              late     negative
## 21291              late      sadness
## 21292            august     positive
## 21293             sunny anticipation
## 21294             sunny          joy
## 21295             sunny     positive
## 21296             sunny     surprise
## 21297            chilly     negative
## 21298           perfect anticipation
## 21299           perfect          joy
## 21300           perfect     positive
## 21301           perfect        trust
## 21302              late     negative
## 21303              late      sadness
## 21304              cold     negative
## 21305               hot        anger
## 21306               hot        anger
## 21307            august     positive
## 21308              cold     negative
## 21309            august     positive
## 21310              fire         fear
## 21311            school        trust
## 21312               sun anticipation
## 21313               sun          joy
## 21314               sun     positive
## 21315               sun     surprise
## 21316               sun        trust
## 21317              cold     negative
## 21318              cold     negative
## 21319              talk     positive
## 21320            arrive anticipation
## 21321             sweat         fear
## 21322       immediately anticipation
## 21323       immediately     negative
## 21324       immediately     positive
## 21325          reporter     positive
## 21326          reporter        trust
## 21327             start anticipation
## 21328              cold     negative
## 21329             leave     negative
## 21330             leave      sadness
## 21331             leave     surprise
## 21332          football anticipation
## 21333          football          joy
## 21334          football     positive
## 21335             start anticipation
## 21336             start anticipation
## 21337           perfect anticipation
## 21338           perfect          joy
## 21339           perfect     positive
## 21340           perfect        trust
## 21341          football anticipation
## 21342          football          joy
## 21343          football     positive
## 21344             sunny anticipation
## 21345             sunny          joy
## 21346             sunny     positive
## 21347             sunny     surprise
## 21348         including     positive
## 21349            arrive anticipation
## 21350         miserably     negative
## 21351         miserably      sadness
## 21352              time anticipation
## 21353               sun anticipation
## 21354               sun          joy
## 21355               sun     positive
## 21356               sun     surprise
## 21357               sun        trust
## 21358            chilly     negative
## 21359               sky     positive
## 21360             major     positive
## 21361    disappointment      disgust
## 21362    disappointment     negative
## 21363    disappointment      sadness
## 21364              glad anticipation
## 21365              glad          joy
## 21366              glad     positive
## 21367             weird      disgust
## 21368             weird     negative
## 21369             dirty      disgust
## 21370             dirty     negative
## 21371       progressive     positive
## 21372             mayor     positive
## 21373        pedestrian     negative
## 21374            center     positive
## 21375            center        trust
## 21376            center     positive
## 21377            center        trust
## 21378           network anticipation
## 21379         unpopular      disgust
## 21380         unpopular     negative
## 21381         unpopular      sadness
## 21382             clean          joy
## 21383             clean     positive
## 21384             clean        trust
## 21385             clean          joy
## 21386             clean     positive
## 21387             clean        trust
## 21388             nasty        anger
## 21389             nasty      disgust
## 21390             nasty         fear
## 21391             nasty     negative
## 21392             nasty      sadness
## 21393          homeless        anger
## 21394          homeless anticipation
## 21395          homeless      disgust
## 21396          homeless         fear
## 21397          homeless     negative
## 21398          homeless      sadness
## 21399              hell        anger
## 21400              hell      disgust
## 21401              hell         fear
## 21402              hell     negative
## 21403              hell      sadness
## 21404            filthy      disgust
## 21405            filthy     negative
## 21406          homeless        anger
## 21407          homeless anticipation
## 21408          homeless      disgust
## 21409          homeless         fear
## 21410          homeless     negative
## 21411          homeless      sadness
## 21412               don     positive
## 21413               don        trust
## 21414         expecting anticipation
## 21415          gigantic     positive
## 21416          homeless        anger
## 21417          homeless anticipation
## 21418          homeless      disgust
## 21419          homeless         fear
## 21420          homeless     negative
## 21421          homeless      sadness
## 21422            pretty anticipation
## 21423            pretty          joy
## 21424            pretty     positive
## 21425            pretty        trust
## 21426             shady         fear
## 21427             shady     negative
## 21428         recommend     positive
## 21429         recommend        trust
## 21430          homeless        anger
## 21431          homeless anticipation
## 21432          homeless      disgust
## 21433          homeless         fear
## 21434          homeless     negative
## 21435          homeless      sadness
## 21436          resident     positive
## 21437             agree     positive
## 21438             split     negative
## 21439          shopping anticipation
## 21440          shopping          joy
## 21441          shopping     positive
## 21442          shopping     surprise
## 21443          shopping        trust
## 21444          homeless        anger
## 21445          homeless anticipation
## 21446          homeless      disgust
## 21447          homeless         fear
## 21448          homeless     negative
## 21449          homeless      sadness
## 21450             petty     negative
## 21451             crime        anger
## 21452             crime     negative
## 21453            pretty anticipation
## 21454            pretty          joy
## 21455            pretty     positive
## 21456            pretty        trust
## 21457              ugly      disgust
## 21458              ugly     negative
## 21459               tax     negative
## 21460               tax      sadness
## 21461               tax     negative
## 21462               tax      sadness
## 21463             clean          joy
## 21464             clean     positive
## 21465             clean        trust
## 21466          pleasant anticipation
## 21467          pleasant          joy
## 21468          pleasant     positive
## 21469          pleasant     surprise
## 21470          pleasant        trust
## 21471              love          joy
## 21472              love     positive
## 21473               fun anticipation
## 21474               fun          joy
## 21475               fun     positive
## 21476        convenient     positive
## 21477      neighborhood anticipation
## 21478             quiet     positive
## 21479             quiet      sadness
## 21480          peaceful anticipation
## 21481          peaceful          joy
## 21482          peaceful     positive
## 21483          peaceful     surprise
## 21484          peaceful        trust
## 21485             crime        anger
## 21486             crime     negative
## 21487               bad        anger
## 21488               bad      disgust
## 21489               bad         fear
## 21490               bad     negative
## 21491               bad      sadness
## 21492               bad        anger
## 21493               bad      disgust
## 21494               bad         fear
## 21495               bad     negative
## 21496               bad      sadness
## 21497               bad        anger
## 21498               bad      disgust
## 21499               bad         fear
## 21500               bad     negative
## 21501               bad      sadness
## 21502          resident     positive
## 21503               hot        anger
## 21504       shoplifting        anger
## 21505       shoplifting      disgust
## 21506       shoplifting     negative
## 21507          burglary     negative
## 21508              save          joy
## 21509              save     positive
## 21510              save        trust
## 21511            liquor        anger
## 21512            liquor          joy
## 21513            liquor     negative
## 21514            liquor      sadness
## 21515              love          joy
## 21516              love     positive
## 21517             guess     surprise
## 21518             clean          joy
## 21519             clean     positive
## 21520             clean        trust
## 21521            agreed     positive
## 21522            agreed        trust
## 21523             dirty      disgust
## 21524             dirty     negative
## 21525              rest     positive
## 21526              copy     negative
## 21527          horrible        anger
## 21528          horrible      disgust
## 21529          horrible         fear
## 21530          horrible     negative
## 21531               bad        anger
## 21532               bad      disgust
## 21533               bad         fear
## 21534               bad     negative
## 21535               bad      sadness
## 21536        impression     positive
## 21537           excited anticipation
## 21538           excited          joy
## 21539           excited     positive
## 21540           excited     surprise
## 21541           excited        trust
## 21542        pedestrian     negative
## 21543            proper     positive
## 21544              rail        anger
## 21545              rail anticipation
## 21546              rail     negative
## 21547              wild     negative
## 21548              wild     surprise
## 21549               die         fear
## 21550               die     negative
## 21551               die      sadness
## 21552            unsafe         fear
## 21553            unsafe     negative
## 21554            pretty anticipation
## 21555            pretty          joy
## 21556            pretty     positive
## 21557            pretty        trust
## 21558               don     positive
## 21559               don        trust
## 21560              risk anticipation
## 21561              risk         fear
## 21562              risk     negative
## 21563           delayed     negative
## 21564            degree     positive
## 21565            pretty anticipation
## 21566            pretty          joy
## 21567            pretty     positive
## 21568            pretty        trust
## 21569              wild     negative
## 21570              wild     surprise
## 21571              cold     negative
## 21572         scorching        anger
## 21573         scorching     negative
## 21574           concord     positive
## 21575           concord        trust
## 21576             weird      disgust
## 21577             weird     negative
## 21578            unique     positive
## 21579            unique     surprise
## 21580         wonderful          joy
## 21581         wonderful     positive
## 21582         wonderful     surprise
## 21583         wonderful        trust
## 21584              gate        trust
## 21585              wild     negative
## 21586              wild     surprise
## 21587              time anticipation
## 21588             worry anticipation
## 21589             worry         fear
## 21590             worry     negative
## 21591             worry      sadness
## 21592             digit        trust
## 21593              land     positive
## 21594              true          joy
## 21595              true     positive
## 21596              true        trust
## 21597             coast     positive
## 21598           account        trust
## 21599              damn        anger
## 21600              damn      disgust
## 21601              damn     negative
## 21602            forget     negative
## 21603            august     positive
## 21604            lowest     negative
## 21605            lowest      sadness
## 21606              time anticipation
## 21607          favorite          joy
## 21608          favorite     positive
## 21609          favorite        trust
## 21610               hot        anger
## 21611              cold     negative
## 21612             coast     positive
## 21613          freezing     negative
## 21614            degree     positive
## 21615          variable     surprise
## 21616            united     positive
## 21617            united        trust
## 21618           concord     positive
## 21619           concord        trust
## 21620            degree     positive
## 21621           pacific     positive
## 21622          isolated         fear
## 21623          isolated     negative
## 21624          isolated      sadness
## 21625              cool     positive
## 21626               sea     positive
## 21627             level     positive
## 21628             level        trust
## 21629               gap     negative
## 21630           bellows        anger
## 21631               hot        anger
## 21632          military         fear
## 21633        changeable anticipation
## 21634        changeable     surprise
## 21635            coming anticipation
## 21636             beach          joy
## 21637           concord     positive
## 21638           concord        trust
## 21639          favorite          joy
## 21640          favorite     positive
## 21641          favorite        trust
## 21642           blanket        trust
## 21643              wait anticipation
## 21644              wait     negative
## 21645               hot        anger
## 21646              time anticipation
## 21647              cold     negative
## 21648               apt     positive
## 21649              pool     positive
## 21650              jump          joy
## 21651              jump     positive
## 21652              wait anticipation
## 21653              wait     negative
## 21654              pool     positive
## 21655              pool     positive
## 21656             lower     negative
## 21657             lower      sadness
## 21658              pool     positive
## 21659             build     positive
## 21660         surprised     surprise
## 21661              pool     positive
## 21662             found          joy
## 21663             found     positive
## 21664             found        trust
## 21665          familiar     positive
## 21666          familiar        trust
## 21667             guess     surprise
## 21668             lower     negative
## 21669             lower      sadness
## 21670      neighborhood anticipation
## 21671              rest     positive
## 21672            center     positive
## 21673            center        trust
## 21674               bad        anger
## 21675               bad      disgust
## 21676               bad         fear
## 21677               bad     negative
## 21678               bad      sadness
## 21679           worried     negative
## 21680           worried      sadness
## 21681            center     positive
## 21682            center        trust
## 21683             guess     surprise
## 21684             visit     positive
## 21685            center     positive
## 21686            center        trust
## 21687          homeless        anger
## 21688          homeless anticipation
## 21689          homeless      disgust
## 21690          homeless         fear
## 21691          homeless     negative
## 21692          homeless      sadness
## 21693        aggressive        anger
## 21694        aggressive         fear
## 21695        aggressive     negative
## 21696          presence     positive
## 21697              time anticipation
## 21698            center     positive
## 21699            center        trust
## 21700              hell        anger
## 21701              hell      disgust
## 21702              hell         fear
## 21703              hell     negative
## 21704              hell      sadness
## 21705              dark      sadness
## 21706        aggressive        anger
## 21707        aggressive         fear
## 21708        aggressive     negative
## 21709              pick     positive
## 21710             fight        anger
## 21711             fight         fear
## 21712             fight     negative
## 21713          shooting        anger
## 21714          shooting         fear
## 21715          shooting     negative
## 21716       threatening        anger
## 21717       threatening      disgust
## 21718       threatening         fear
## 21719       threatening     negative
## 21720              shit        anger
## 21721              shit      disgust
## 21722              shit     negative
## 21723        disgusting        anger
## 21724        disgusting      disgust
## 21725        disgusting         fear
## 21726        disgusting     negative
## 21727         civilized          joy
## 21728         civilized     positive
## 21729         civilized        trust
## 21730            center     positive
## 21731            center        trust
## 21732           feeling        anger
## 21733           feeling anticipation
## 21734           feeling      disgust
## 21735           feeling         fear
## 21736           feeling          joy
## 21737           feeling     negative
## 21738           feeling     positive
## 21739           feeling      sadness
## 21740           feeling     surprise
## 21741           feeling        trust
## 21742           mistake     negative
## 21743           mistake      sadness
## 21744               bad        anger
## 21745               bad      disgust
## 21746               bad         fear
## 21747               bad     negative
## 21748               bad      sadness
## 21749      questionable      disgust
## 21750      questionable     negative
## 21751           library     positive
## 21752               art anticipation
## 21753               art          joy
## 21754               art     positive
## 21755               art      sadness
## 21756               art     surprise
## 21757             start anticipation
## 21758          homeless        anger
## 21759          homeless anticipation
## 21760          homeless      disgust
## 21761          homeless         fear
## 21762          homeless     negative
## 21763          homeless      sadness
## 21764            center     positive
## 21765            center        trust
## 21766     uncomfortable     negative
## 21767              late     negative
## 21768              late      sadness
## 21769            center     positive
## 21770            center        trust
## 21771             clean          joy
## 21772             clean     positive
## 21773             clean        trust
## 21774              safe          joy
## 21775              safe     positive
## 21776              safe        trust
## 21777          homeless        anger
## 21778          homeless anticipation
## 21779          homeless      disgust
## 21780          homeless         fear
## 21781          homeless     negative
## 21782          homeless      sadness
## 21783            center     positive
## 21784            center        trust
## 21785               bad        anger
## 21786               bad      disgust
## 21787               bad         fear
## 21788               bad     negative
## 21789               bad      sadness
## 21790          building     positive
## 21791              hope anticipation
## 21792              hope          joy
## 21793              hope     positive
## 21794              hope     surprise
## 21795              hope        trust
## 21796              shit        anger
## 21797              shit      disgust
## 21798              shit     negative
## 21799              time anticipation
## 21800          homeless        anger
## 21801          homeless anticipation
## 21802          homeless      disgust
## 21803          homeless         fear
## 21804          homeless     negative
## 21805          homeless      sadness
## 21806             smell        anger
## 21807             smell      disgust
## 21808             smell     negative
## 21809              real     positive
## 21810              real        trust
## 21811         beautiful          joy
## 21812         beautiful     positive
## 21813            public anticipation
## 21814            public     positive
## 21815         immigrant         fear
## 21816             grimy      disgust
## 21817             grimy     negative
## 21818            pretty anticipation
## 21819            pretty          joy
## 21820            pretty     positive
## 21821            pretty        trust
## 21822              main     positive
## 21823         abandoned        anger
## 21824         abandoned         fear
## 21825         abandoned     negative
## 21826         abandoned      sadness
## 21827               don     positive
## 21828               don        trust
## 21829           forward     positive
## 21830            system        trust
## 21831          progress anticipation
## 21832          progress          joy
## 21833          progress     positive
## 21834         community     positive
## 21835          gambling anticipation
## 21836          gambling     negative
## 21837          gambling     surprise
## 21838           happily          joy
## 21839           happily     positive
## 21840              land     positive
## 21841             build     positive
## 21842             build     positive
## 21843          shopping anticipation
## 21844          shopping          joy
## 21845          shopping     positive
## 21846          shopping     surprise
## 21847          shopping        trust
## 21848               top anticipation
## 21849               top     positive
## 21850               top        trust
## 21851          disaster        anger
## 21852          disaster      disgust
## 21853          disaster         fear
## 21854          disaster     negative
## 21855          disaster      sadness
## 21856          disaster     surprise
## 21857               bad        anger
## 21858               bad      disgust
## 21859               bad         fear
## 21860               bad     negative
## 21861               bad      sadness
## 21862              holy     positive
## 21863              hell        anger
## 21864              hell      disgust
## 21865              hell         fear
## 21866              hell     negative
## 21867              hell      sadness
## 21868              fake     negative
## 21869             shell        anger
## 21870             shell         fear
## 21871             shell     negative
## 21872             shell      sadness
## 21873             shell     surprise
## 21874              fake     negative
## 21875            secret        trust
## 21876             store anticipation
## 21877             store     positive
## 21878               top anticipation
## 21879               top     positive
## 21880               top        trust
## 21881          cemetery         fear
## 21882          cemetery     negative
## 21883          cemetery      sadness
## 21884               top anticipation
## 21885               top     positive
## 21886               top        trust
## 21887          atrocity        anger
## 21888          atrocity      disgust
## 21889          atrocity         fear
## 21890          atrocity     negative
## 21891          atrocity      sadness
## 21892          forgiven     positive
## 21893             money        anger
## 21894             money anticipation
## 21895             money          joy
## 21896             money     positive
## 21897             money     surprise
## 21898             money        trust
## 21899      thanksgiving          joy
## 21900      thanksgiving     positive
## 21901          struggle        anger
## 21902          struggle         fear
## 21903          struggle     negative
## 21904          struggle      sadness
## 21905              time anticipation
## 21906         organized     positive
## 21907          terribly      sadness
## 21908             wrong     negative
## 21909         surprised     surprise
## 21910              glad anticipation
## 21911              glad          joy
## 21912              glad     positive
## 21913              save          joy
## 21914              save     positive
## 21915              save        trust
## 21916       information     positive
## 21917          official        trust
## 21918            united     positive
## 21919            united        trust
## 21920           culture     positive
## 21921          majority          joy
## 21922          majority     positive
## 21923          majority        trust
## 21924              time anticipation
## 21925            united     positive
## 21926            united        trust
## 21927        government         fear
## 21928        government     negative
## 21929        government         fear
## 21930        government     negative
## 21931             break     surprise
## 21932              rest     positive
## 21933          official        trust
## 21934           obvious     positive
## 21935           obvious        trust
## 21936             moral        anger
## 21937             moral     positive
## 21938             moral        trust
## 21939           ongoing anticipation
## 21940          struggle        anger
## 21941          struggle         fear
## 21942          struggle     negative
## 21943          struggle      sadness
## 21944             legal     positive
## 21945             legal        trust
## 21946             tribe        trust
## 21947        government         fear
## 21948        government     negative
## 21949         structure     positive
## 21950         structure        trust
## 21951           feature     positive
## 21952           feature     positive
## 21953              rest     positive
## 21954          forcibly        anger
## 21955          forcibly         fear
## 21956          forcibly     negative
## 21957       grandmother     positive
## 21958               die         fear
## 21959               die     negative
## 21960               die      sadness
## 21961             trash      disgust
## 21962             trash     negative
## 21963             trash      sadness
## 21964             waste      disgust
## 21965             waste     negative
## 21966              land     positive
## 21967              plan anticipation
## 21968            buried         fear
## 21969            buried     negative
## 21970            buried      sadness
## 21971          cemetery         fear
## 21972          cemetery     negative
## 21973          cemetery      sadness
## 21974          cemetery         fear
## 21975          cemetery     negative
## 21976          cemetery      sadness
## 21977         construct     positive
## 21978             daily anticipation
## 21979          ceremony          joy
## 21980          ceremony     positive
## 21981          ceremony     surprise
## 21982            chosen     positive
## 21983              food          joy
## 21984              food     positive
## 21985              food        trust
## 21986          symbolic     positive
## 21987            united     positive
## 21988            united        trust
## 21989              land     positive
## 21990         structure     positive
## 21991         structure        trust
## 21992         structure     positive
## 21993         structure        trust
## 21994     determination     positive
## 21995     determination        trust
## 21996          forcibly        anger
## 21997          forcibly         fear
## 21998          forcibly     negative
## 21999           labored     negative
## 22000           labored      sadness
## 22001              land     positive
## 22002           disease        anger
## 22003           disease      disgust
## 22004           disease         fear
## 22005           disease     negative
## 22006           disease      sadness
## 22007        starvation         fear
## 22008        starvation     negative
## 22009        starvation      sadness
## 22010           despair        anger
## 22011           despair      disgust
## 22012           despair         fear
## 22013           despair     negative
## 22014           despair      sadness
## 22015          welcomed          joy
## 22016          welcomed     positive
## 22017              hide         fear
## 22018          building     positive
## 22019         ancestral        trust
## 22020            united     positive
## 22021            united        trust
## 22022          suddenly     surprise
## 22023     determination     positive
## 22024     determination        trust
## 22025         ancestral        trust
## 22026             share anticipation
## 22027             share          joy
## 22028             share     positive
## 22029             share        trust
## 22030              lost     negative
## 22031              lost      sadness
## 22032          cemetery         fear
## 22033          cemetery     negative
## 22034          cemetery      sadness
## 22035              plan anticipation
## 22036               die         fear
## 22037               die     negative
## 22038               die      sadness
## 22039             trash      disgust
## 22040             trash     negative
## 22041             trash      sadness
## 22042               die         fear
## 22043               die     negative
## 22044               die      sadness
## 22045             trash      disgust
## 22046             trash     negative
## 22047             trash      sadness
## 22048            prefer     positive
## 22049            prefer        trust
## 22050          shopping anticipation
## 22051          shopping          joy
## 22052          shopping     positive
## 22053          shopping     surprise
## 22054          shopping        trust
## 22055             waste      disgust
## 22056             waste     negative
## 22057              land     positive
## 22058              food          joy
## 22059              food     positive
## 22060              food        trust
## 22061              time anticipation
## 22062           sketchy     negative
## 22063              love          joy
## 22064              love     positive
## 22065           chicken         fear
## 22066            center     positive
## 22067            center        trust
## 22068              food          joy
## 22069              food     positive
## 22070              food        trust
## 22071              food          joy
## 22072              food     positive
## 22073              food        trust
## 22074         surprised     surprise
## 22075        disgusting        anger
## 22076        disgusting      disgust
## 22077        disgusting         fear
## 22078        disgusting     negative
## 22079               don     positive
## 22080               don        trust
## 22081            diaper      disgust
## 22082             haven     positive
## 22083             haven        trust
## 22084             track anticipation
## 22085             noise     negative
## 22086             noise     negative
## 22087          homeless        anger
## 22088          homeless anticipation
## 22089          homeless      disgust
## 22090          homeless         fear
## 22091          homeless     negative
## 22092          homeless      sadness
## 22093         overgrown     negative
## 22094         desperate     negative
## 22095          blessing anticipation
## 22096          blessing          joy
## 22097          blessing     positive
## 22098          blessing        trust
## 22099             curse        anger
## 22100             curse      disgust
## 22101             curse         fear
## 22102             curse     negative
## 22103             curse      sadness
## 22104         recommend     positive
## 22105         recommend        trust
## 22106              time anticipation
## 22107              fire         fear
## 22108              fire         fear
## 22109             visit     positive
## 22110              rest     positive
## 22111              gate        trust
## 22112               bad        anger
## 22113               bad      disgust
## 22114               bad         fear
## 22115               bad     negative
## 22116               bad      sadness
## 22117           obvious     positive
## 22118           obvious        trust
## 22119            august     positive
## 22120             watch anticipation
## 22121             watch         fear
## 22122      disappointed        anger
## 22123      disappointed      disgust
## 22124      disappointed     negative
## 22125      disappointed      sadness
## 22126          soulless      disgust
## 22127          soulless         fear
## 22128          soulless     negative
## 22129          soulless      sadness
## 22130             bland     negative
## 22131            decent     positive
## 22132              love          joy
## 22133              love     positive
## 22134            forget     negative
## 22135            pretty anticipation
## 22136            pretty          joy
## 22137            pretty     positive
## 22138            pretty        trust
## 22139            polite     positive
## 22140           explore anticipation
## 22141            unsafe         fear
## 22142            unsafe     negative
## 22143               bad        anger
## 22144               bad      disgust
## 22145               bad         fear
## 22146               bad     negative
## 22147               bad      sadness
## 22148            center     positive
## 22149            center        trust
## 22150           explore anticipation
## 22151               bad        anger
## 22152               bad      disgust
## 22153               bad         fear
## 22154               bad     negative
## 22155               bad      sadness
## 22156          homeless        anger
## 22157          homeless anticipation
## 22158          homeless      disgust
## 22159          homeless         fear
## 22160          homeless     negative
## 22161          homeless      sadness
## 22162              safe          joy
## 22163              safe     positive
## 22164              safe        trust
## 22165            bother     negative
## 22166             avoid         fear
## 22167             avoid     negative
## 22168            center     positive
## 22169            center        trust
## 22170       threatening        anger
## 22171       threatening      disgust
## 22172       threatening         fear
## 22173       threatening     negative
## 22174              kill         fear
## 22175              kill     negative
## 22176              kill      sadness
## 22177             lines         fear
## 22178             trash      disgust
## 22179             trash     negative
## 22180             trash      sadness
## 22181         dependent     negative
## 22182         dependent     positive
## 22183         dependent        trust
## 22184              luck anticipation
## 22185              luck          joy
## 22186              luck     positive
## 22187              luck     surprise
## 22188              hate        anger
## 22189              hate      disgust
## 22190              hate         fear
## 22191              hate     negative
## 22192              hate      sadness
## 22193             lucky          joy
## 22194             lucky     positive
## 22195             lucky     surprise
## 22196             extra     positive
## 22197          vigilant         fear
## 22198          vigilant     positive
## 22199          vigilant        trust
## 22200             major     positive
## 22201    disappointment      disgust
## 22202    disappointment     negative
## 22203    disappointment      sadness
## 22204              glad anticipation
## 22205              glad          joy
## 22206              glad     positive
## 22207             weird      disgust
## 22208             weird     negative
## 22209             dirty      disgust
## 22210             dirty     negative
## 22211         expecting anticipation
## 22212        attraction     positive
## 22213             guess     surprise
## 22214             sense     positive
## 22215              gate        trust
## 22216             haven     positive
## 22217             haven        trust
## 22218               bad        anger
## 22219               bad      disgust
## 22220               bad         fear
## 22221               bad     negative
## 22222               bad      sadness
## 22223            coming anticipation
## 22224              food          joy
## 22225              food     positive
## 22226              food        trust
## 22227              time anticipation
## 22228             daily anticipation
## 22229              food          joy
## 22230              food     positive
## 22231              food        trust
## 22232              love          joy
## 22233              love     positive
## 22234            chance     surprise
## 22235              lose        anger
## 22236              lose      disgust
## 22237              lose         fear
## 22238              lose     negative
## 22239              lose      sadness
## 22240              lose     surprise
## 22241            coming anticipation
## 22242              love          joy
## 22243              love     positive
## 22244              flow     positive
## 22245              cool     positive
## 22246              cold     negative
## 22247              cold     negative
## 22248               hot        anger
## 22249              cold     negative
## 22250               hot        anger
## 22251              time anticipation
## 22252              food          joy
## 22253              food     positive
## 22254              food        trust
## 22255              rest     positive
## 22256          terrible        anger
## 22257          terrible      disgust
## 22258          terrible         fear
## 22259          terrible     negative
## 22260          terrible      sadness
## 22261              food          joy
## 22262              food     positive
## 22263              food        trust
## 22264            pretty anticipation
## 22265            pretty          joy
## 22266            pretty     positive
## 22267            pretty        trust
## 22268          culinary     positive
## 22269          culinary        trust
## 22270            advice        trust
## 22271         adventure anticipation
## 22272         adventure     positive
## 22273             sunny anticipation
## 22274             sunny          joy
## 22275             sunny     positive
## 22276             sunny     surprise
## 22277              love          joy
## 22278              love     positive
## 22279              wise     positive
## 22280              trip     surprise
## 22281            pretty anticipation
## 22282            pretty          joy
## 22283            pretty     positive
## 22284            pretty        trust
## 22285        impossible     negative
## 22286        impossible      sadness
## 22287      neighborhood anticipation
## 22288            quaint          joy
## 22289            quaint     positive
## 22290            quaint        trust
## 22291               art anticipation
## 22292               art          joy
## 22293               art     positive
## 22294               art      sadness
## 22295               art     surprise
## 22296             visit     positive
## 22297            pretty anticipation
## 22298            pretty          joy
## 22299            pretty     positive
## 22300            pretty        trust
## 22301           cracked        anger
## 22302           cracked         fear
## 22303           cracked     negative
## 22304            pretty anticipation
## 22305            pretty          joy
## 22306            pretty     positive
## 22307            pretty        trust
## 22308              true          joy
## 22309              true     positive
## 22310              true        trust
## 22311         qualified     positive
## 22312         qualified        trust
## 22313              love          joy
## 22314              love     positive
## 22315            center     positive
## 22316            center        trust
## 22317               art anticipation
## 22318               art          joy
## 22319               art     positive
## 22320               art      sadness
## 22321               art     surprise
## 22322            public anticipation
## 22323            public     positive
## 22324           library     positive
## 22325              main     positive
## 22326             opera        anger
## 22327             opera anticipation
## 22328             opera         fear
## 22329             opera          joy
## 22330             opera     positive
## 22331             opera      sadness
## 22332             opera     surprise
## 22333             opera        trust
## 22334          symphony anticipation
## 22335          symphony          joy
## 22336          symphony     positive
## 22337            assets     positive
## 22338              rule         fear
## 22339              rule        trust
## 22340            center     positive
## 22341            center        trust
## 22342            center     positive
## 22343            center        trust
## 22344          shopping anticipation
## 22345          shopping          joy
## 22346          shopping     positive
## 22347          shopping     surprise
## 22348          shopping        trust
## 22349             green          joy
## 22350             green     positive
## 22351             green        trust
## 22352            center     positive
## 22353            center        trust
## 22354        government         fear
## 22355        government     negative
## 22356            coming anticipation
## 22357              damn        anger
## 22358              damn      disgust
## 22359              damn     negative
## 22360          charming     positive
## 22361             crazy        anger
## 22362             crazy         fear
## 22363             crazy     negative
## 22364             crazy      sadness
## 22365              food          joy
## 22366              food     positive
## 22367              food        trust
## 22368              cute     positive
## 22369              cute     positive
## 22370              lack     negative
## 22371             cross        anger
## 22372             cross         fear
## 22373             cross     negative
## 22374             cross      sadness
## 22375               war         fear
## 22376               war     negative
## 22377          planning anticipation
## 22378          planning     positive
## 22379          planning        trust
## 22380             wrong     negative
## 22381              gate        trust
## 22382             force        anger
## 22383             force         fear
## 22384             force     negative
## 22385            prefer     positive
## 22386            prefer        trust
## 22387             force        anger
## 22388             force         fear
## 22389             force     negative
## 22390            appeal anticipation
## 22391             wrong     negative
## 22392            appeal anticipation
## 22393      architecture        trust
## 22394              cool     positive
## 22395              cool     positive
## 22396            appeal anticipation
## 22397            appeal anticipation
## 22398          minority     negative
## 22399             visit     positive
## 22400            appeal anticipation
## 22401          personal        trust
## 22402             wrong     negative
## 22403         beautiful          joy
## 22404         beautiful     positive
## 22405             visit     positive
## 22406             cheap     negative
## 22407           explore anticipation
## 22408            unsafe         fear
## 22409            unsafe     negative
## 22410               bad        anger
## 22411               bad      disgust
## 22412               bad         fear
## 22413               bad     negative
## 22414               bad      sadness
## 22415            center     positive
## 22416            center        trust
## 22417            unsafe         fear
## 22418            unsafe     negative
## 22419            unsafe         fear
## 22420            unsafe     negative
## 22421          believed        trust
## 22422            unsafe         fear
## 22423            unsafe     negative
## 22424        disgusting        anger
## 22425        disgusting      disgust
## 22426        disgusting         fear
## 22427        disgusting     negative
## 22428            unsafe         fear
## 22429            unsafe     negative
## 22430              safe          joy
## 22431              safe     positive
## 22432              safe        trust
## 22433              fake     negative
## 22434              love          joy
## 22435              love     positive
## 22436             smell        anger
## 22437             smell      disgust
## 22438             smell     negative
## 22439              pick     positive
## 22440            toilet      disgust
## 22441            toilet     negative
## 22442             flush     positive
## 22443          pandemic         fear
## 22444          pandemic     negative
## 22445          pandemic      sadness
## 22446          homeless        anger
## 22447          homeless anticipation
## 22448          homeless      disgust
## 22449          homeless         fear
## 22450          homeless     negative
## 22451          homeless      sadness
## 22452         skeptical     negative
## 22453             haven     positive
## 22454             haven        trust
## 22455               bad        anger
## 22456               bad      disgust
## 22457               bad         fear
## 22458               bad     negative
## 22459               bad      sadness
## 22460             weird      disgust
## 22461             weird     negative
## 22462              true          joy
## 22463              true     positive
## 22464              true        trust
## 22465              mess      disgust
## 22466              mess     negative
## 22467             diary          joy
## 22468             diary     positive
## 22469             diary        trust
## 22470          terminal         fear
## 22471          terminal     negative
## 22472          terminal      sadness
## 22473            cancer        anger
## 22474            cancer      disgust
## 22475            cancer         fear
## 22476            cancer     negative
## 22477            cancer      sadness
## 22478         diagnosis anticipation
## 22479         diagnosis         fear
## 22480         diagnosis     negative
## 22481         diagnosis        trust
## 22482               hit        anger
## 22483               hit     negative
## 22484              rest     positive
## 22485               hit        anger
## 22486               hit     negative
## 22487            ground        trust
## 22488               hot        anger
## 22489            coming anticipation
## 22490           reading     positive
## 22491        population     positive
## 22492           reading     positive
## 22493             level     positive
## 22494             level        trust
## 22495           medical anticipation
## 22496           medical         fear
## 22497           medical     positive
## 22498           medical        trust
## 22499           feeling        anger
## 22500           feeling anticipation
## 22501           feeling      disgust
## 22502           feeling         fear
## 22503           feeling          joy
## 22504           feeling     negative
## 22505           feeling     positive
## 22506           feeling      sadness
## 22507           feeling     surprise
## 22508           feeling        trust
## 22509              doom         fear
## 22510              doom     negative
## 22511           ominous anticipation
## 22512           ominous         fear
## 22513           ominous     negative
## 22514              pain         fear
## 22515              pain     negative
## 22516              pain      sadness
## 22517            attack        anger
## 22518            attack         fear
## 22519            attack     negative
## 22520             sweat         fear
## 22521            create          joy
## 22522            create     positive
## 22523          humanity          joy
## 22524          humanity     positive
## 22525          humanity        trust
## 22526             clean          joy
## 22527             clean     positive
## 22528             clean        trust
## 22529          supplies     positive
## 22530      civilization     positive
## 22531      civilization        trust
## 22532             found          joy
## 22533             found     positive
## 22534             found        trust
## 22535       inspiration anticipation
## 22536       inspiration          joy
## 22537       inspiration     positive
## 22538              time anticipation
## 22539           touched     negative
## 22540        commission        trust
## 22541           promise          joy
## 22542           promise     positive
## 22543           promise        trust
## 22544         dangerous         fear
## 22545         dangerous     negative
## 22546         including     positive
## 22547           decline     negative
## 22548             green          joy
## 22549             green     positive
## 22550             green        trust
## 22551        regulatory         fear
## 22552        regulatory     negative
## 22553               ban     negative
## 22554       experienced     positive
## 22555       experienced        trust
## 22556           fragile         fear
## 22557           fragile     negative
## 22558           fragile      sadness
## 22559              hope anticipation
## 22560              hope          joy
## 22561              hope     positive
## 22562              hope     surprise
## 22563              hope        trust
## 22564          learning     positive
## 22565         community     positive
## 22566           ability     positive
## 22567              heal          joy
## 22568              heal     positive
## 22569              heal        trust
## 22570           fallacy     negative
## 22571              blue      sadness
## 22572          negative     negative
## 22573          negative      sadness
## 22574          humanity          joy
## 22575          humanity     positive
## 22576          humanity        trust
## 22577             clean          joy
## 22578             clean     positive
## 22579             clean        trust
## 22580          supplies     positive
## 22581               bad        anger
## 22582               bad      disgust
## 22583               bad         fear
## 22584               bad     negative
## 22585               bad      sadness
## 22586             crash         fear
## 22587             crash     negative
## 22588             crash      sadness
## 22589             crash     surprise
## 22590           horizon anticipation
## 22591           horizon     positive
## 22592             crash         fear
## 22593             crash     negative
## 22594             crash      sadness
## 22595             crash     surprise
## 22596           horizon anticipation
## 22597           horizon     positive
## 22598              pick     positive
## 22599              trip     surprise
## 22600           mistake     negative
## 22601           mistake      sadness
## 22602             spent     negative
## 22603          tomorrow anticipation
## 22604             crazy        anger
## 22605             crazy         fear
## 22606             crazy     negative
## 22607             crazy      sadness
## 22608       experienced     positive
## 22609       experienced        trust
## 22610              time anticipation
## 22611               sun anticipation
## 22612               sun          joy
## 22613               sun     positive
## 22614               sun     surprise
## 22615               sun        trust
## 22616           intense        anger
## 22617           intense      disgust
## 22618           intense         fear
## 22619           intense          joy
## 22620           intense     negative
## 22621           intense     positive
## 22622           intense     surprise
## 22623           intense        trust
## 22624               sun anticipation
## 22625               sun          joy
## 22626               sun     positive
## 22627               sun     surprise
## 22628               sun        trust
## 22629               bad        anger
## 22630               bad      disgust
## 22631               bad         fear
## 22632               bad     negative
## 22633               bad      sadness
## 22634             crawl      disgust
## 22635             crawl     negative
## 22636               ass     negative
## 22637         insulting        anger
## 22638         insulting      disgust
## 22639         insulting         fear
## 22640         insulting     negative
## 22641         insulting      sadness
## 22642               top anticipation
## 22643               top     positive
## 22644               top        trust
## 22645              time anticipation
## 22646              shit        anger
## 22647              shit      disgust
## 22648              shit     negative
## 22649            unsafe         fear
## 22650            unsafe     negative
## 22651           illness         fear
## 22652           illness     negative
## 22653           illness      sadness
## 22654              love          joy
## 22655              love     positive
## 22656          accident         fear
## 22657          accident     negative
## 22658          accident      sadness
## 22659          accident     surprise
## 22660            pretty anticipation
## 22661            pretty          joy
## 22662            pretty     positive
## 22663            pretty        trust
## 22664          hospital         fear
## 22665          hospital      sadness
## 22666          hospital        trust
## 22667          grateful     positive
## 22668             alive anticipation
## 22669             alive          joy
## 22670             alive     positive
## 22671             alive        trust
## 22672           halfway     negative
## 22673             guess     surprise
## 22674             alive anticipation
## 22675             alive          joy
## 22676             alive     positive
## 22677             alive        trust
## 22678            damage        anger
## 22679            damage      disgust
## 22680            damage     negative
## 22681            damage      sadness
## 22682             cover        trust
## 22683            danger         fear
## 22684            danger     negative
## 22685            danger      sadness
## 22686              time anticipation
## 22687           unaware     negative
## 22688        population     positive
## 22689     unprecedented     surprise
## 22690            nation        trust
## 22691            pretty anticipation
## 22692            pretty          joy
## 22693            pretty     positive
## 22694            pretty        trust
## 22695             agree     positive
## 22696            nation        trust
## 22697            pretty anticipation
## 22698            pretty          joy
## 22699            pretty     positive
## 22700            pretty        trust
## 22701            pretty anticipation
## 22702            pretty          joy
## 22703            pretty     positive
## 22704            pretty        trust
## 22705            center     positive
## 22706            center        trust
## 22707          collapse      disgust
## 22708          collapse         fear
## 22709          collapse     negative
## 22710          collapse      sadness
## 22711          collapse      disgust
## 22712          collapse         fear
## 22713          collapse     negative
## 22714          collapse      sadness
## 22715           content          joy
## 22716           content     positive
## 22717           content        trust
## 22718              time anticipation
## 22719           supreme     positive
## 22720            leader     positive
## 22721            leader        trust
## 22722           supreme     positive
## 22723            leader     positive
## 22724            leader        trust
## 22725        prohibited        anger
## 22726        prohibited      disgust
## 22727        prohibited         fear
## 22728        prohibited     negative
## 22729           falling     negative
## 22730           falling      sadness
## 22731              mess      disgust
## 22732              mess     negative
## 22733            damage        anger
## 22734            damage      disgust
## 22735            damage     negative
## 22736            damage      sadness
## 22737        accelerate anticipation
## 22738          dementia         fear
## 22739          dementia     negative
## 22740          dementia      sadness
## 22741           asshole        anger
## 22742           asshole      disgust
## 22743           asshole     negative
## 22744              jerk        anger
## 22745              jerk     surprise
## 22746             wrong     negative
## 22747         diagnosis anticipation
## 22748         diagnosis         fear
## 22749         diagnosis     negative
## 22750         diagnosis        trust
## 22751             anger        anger
## 22752             anger     negative
## 22753     inappropriate        anger
## 22754     inappropriate      disgust
## 22755     inappropriate     negative
## 22756     inappropriate      sadness
## 22757       molestation        anger
## 22758       molestation      disgust
## 22759       molestation         fear
## 22760       molestation     negative
## 22761       molestation      sadness
## 22762            august     positive
## 22763         believing     positive
## 22764         believing        trust
## 22765             argue        anger
## 22766             argue     negative
## 22767           leading        trust
## 22768              hell        anger
## 22769              hell      disgust
## 22770              hell         fear
## 22771              hell     negative
## 22772              hell      sadness
## 22773          hitherto     negative
## 22774            debate     positive
## 22775            resign        anger
## 22776            resign      disgust
## 22777            resign         fear
## 22778            resign     negative
## 22779            resign      sadness
## 22780             giant         fear
## 22781               war         fear
## 22782               war     negative
## 22783             ghost         fear
## 22784            prefer     positive
## 22785            prefer        trust
## 22786            hungry anticipation
## 22787            hungry     negative
## 22788               bad        anger
## 22789               bad      disgust
## 22790               bad         fear
## 22791               bad     negative
## 22792               bad      sadness
## 22793          increase     positive
## 22794               bad        anger
## 22795               bad      disgust
## 22796               bad         fear
## 22797               bad     negative
## 22798               bad      sadness
## 22799         scientist anticipation
## 22800         scientist     positive
## 22801         scientist        trust
## 22802          collapse      disgust
## 22803          collapse         fear
## 22804          collapse     negative
## 22805          collapse      sadness
## 22806          collapse      disgust
## 22807          collapse         fear
## 22808          collapse     negative
## 22809          collapse      sadness
## 22810           related        trust
## 22811              love          joy
## 22812              love     positive
## 22813          collapse      disgust
## 22814          collapse         fear
## 22815          collapse     negative
## 22816          collapse      sadness
## 22817          building     positive
## 22818          collapse      disgust
## 22819          collapse         fear
## 22820          collapse     negative
## 22821          collapse      sadness
## 22822           related        trust
## 22823         structure     positive
## 22824         structure        trust
## 22825           failing        anger
## 22826           failing anticipation
## 22827           failing         fear
## 22828           failing     negative
## 22829           failing      sadness
## 22830           related        trust
## 22831          collapse      disgust
## 22832          collapse         fear
## 22833          collapse     negative
## 22834          collapse      sadness
## 22835          collapse      disgust
## 22836          collapse         fear
## 22837          collapse     negative
## 22838          collapse      sadness
## 22839          imminent anticipation
## 22840          imminent         fear
## 22841          collapse      disgust
## 22842          collapse         fear
## 22843          collapse     negative
## 22844          collapse      sadness
## 22845          collapse      disgust
## 22846          collapse         fear
## 22847          collapse     negative
## 22848          collapse      sadness
## 22849          firearms        anger
## 22850          firearms         fear
## 22851          firearms     negative
## 22852          collapse      disgust
## 22853          collapse         fear
## 22854          collapse     negative
## 22855          collapse      sadness
## 22856        government         fear
## 22857        government     negative
## 22858            action     positive
## 22859              lead     positive
## 22860          collapse      disgust
## 22861          collapse         fear
## 22862          collapse     negative
## 22863          collapse      sadness
## 22864        government         fear
## 22865        government     negative
## 22866              fill        trust
## 22867           falling     negative
## 22868           falling      sadness
## 22869               bad        anger
## 22870               bad      disgust
## 22871               bad         fear
## 22872               bad     negative
## 22873               bad      sadness
## 22874            agreed     positive
## 22875            agreed        trust
## 22876           symptom     negative
## 22877            larger      disgust
## 22878            larger     surprise
## 22879            larger        trust
## 22880          intended anticipation
## 22881          intended     positive
## 22882         essential     positive
## 22883           reading     positive
## 22884              love          joy
## 22885              love     positive
## 22886         unpopular      disgust
## 22887         unpopular     negative
## 22888         unpopular      sadness
## 22889             civil     positive
## 22890         unpopular      disgust
## 22891         unpopular     negative
## 22892         unpopular      sadness
## 22893        discussion     positive
## 22894           subject     negative
## 22895               ban     negative
## 22896            action     positive
## 22897           contact     positive
## 22898            ransom        anger
## 22899            ransom         fear
## 22900            ransom     negative
## 22901           hostage        anger
## 22902           hostage         fear
## 22903           hostage     negative
## 22904           captain     positive
## 22905           hostage        anger
## 22906           hostage         fear
## 22907           hostage     negative
## 22908             haven     positive
## 22909             haven        trust
## 22910               don     positive
## 22911               don        trust
## 22912         radiation         fear
## 22913         radiation     negative
## 22914              kill         fear
## 22915              kill     negative
## 22916              kill      sadness
## 22917              ship anticipation
## 22918              crew        trust
## 22919              ship anticipation
## 22920              ship anticipation
## 22921         effective     positive
## 22922         effective        trust
## 22923          military         fear
## 22924             money        anger
## 22925             money anticipation
## 22926             money          joy
## 22927             money     positive
## 22928             money     surprise
## 22929             money        trust
## 22930             money        anger
## 22931             money anticipation
## 22932             money          joy
## 22933             money     positive
## 22934             money     surprise
## 22935             money        trust
## 22936             trust        trust
## 22937             chase     negative
## 22938            insane        anger
## 22939            insane         fear
## 22940            insane     negative
## 22941             money        anger
## 22942             money anticipation
## 22943             money          joy
## 22944             money     positive
## 22945             money     surprise
## 22946             money        trust
## 22947              ship anticipation
## 22948            bunker         fear
## 22949             spent     negative
## 22950               pay anticipation
## 22951               pay          joy
## 22952               pay     positive
## 22953               pay        trust
## 22954              crew        trust
## 22955            public anticipation
## 22956            public     positive
## 22957             build     positive
## 22958            attack        anger
## 22959            attack         fear
## 22960            attack     negative
## 22961             worse         fear
## 22962             worse     negative
## 22963             worse      sadness
## 22964            insane        anger
## 22965            insane         fear
## 22966            insane     negative
## 22967          expected anticipation
## 22968            bunker         fear
## 22969             waste      disgust
## 22970             waste     negative
## 22971            bunker         fear
## 22972        retirement anticipation
## 22973        retirement         fear
## 22974        retirement          joy
## 22975        retirement     negative
## 22976        retirement     positive
## 22977        retirement      sadness
## 22978        retirement        trust
## 22979           content          joy
## 22980           content     positive
## 22981           content        trust
## 22982        government         fear
## 22983        government     negative
## 22984    accountability     positive
## 22985    accountability        trust
## 22986            larger      disgust
## 22987            larger     surprise
## 22988            larger        trust
## 22989               ill        anger
## 22990               ill      disgust
## 22991               ill         fear
## 22992               ill     negative
## 22993               ill      sadness
## 22994          improved     positive
## 22995          military         fear
## 22996           explore anticipation
## 22997           battery        anger
## 22998           battery     negative
## 22999            system        trust
## 23000              ship anticipation
## 23001         efficient anticipation
## 23002         efficient     positive
## 23003         efficient        trust
## 23004               pop     negative
## 23005               pop     surprise
## 23006             spent     negative
## 23007      manufacturer     positive
## 23008          improved     positive
## 23009          military         fear
## 23010               art anticipation
## 23011               art          joy
## 23012               art     positive
## 23013               art      sadness
## 23014               art     surprise
## 23015        technology     positive
## 23016         operation         fear
## 23017         operation        trust
## 23018              ship anticipation
## 23019            demand        anger
## 23020            demand     negative
## 23021             lower     negative
## 23022             lower      sadness
## 23023          regulate     positive
## 23024              time anticipation
## 23025             lines         fear
## 23026            luxury          joy
## 23027            luxury     positive
## 23028            losing        anger
## 23029            losing     negative
## 23030            losing      sadness
## 23031             money        anger
## 23032             money anticipation
## 23033             money          joy
## 23034             money     positive
## 23035             money     surprise
## 23036             money        trust
## 23037        authorized     positive
## 23038          constant     positive
## 23039          constant        trust
## 23040              john      disgust
## 23041              john     negative
## 23042              ship anticipation
## 23043           account        trust
## 23044            insane        anger
## 23045            insane         fear
## 23046            insane     negative
## 23047              bomb        anger
## 23048              bomb         fear
## 23049              bomb     negative
## 23050              bomb      sadness
## 23051              bomb     surprise
## 23052              deal anticipation
## 23053              deal          joy
## 23054              deal     positive
## 23055              deal     surprise
## 23056              deal        trust
## 23057              time anticipation
## 23058          military         fear
## 23059             coast     positive
## 23060              time anticipation
## 23061              deal anticipation
## 23062              deal          joy
## 23063              deal     positive
## 23064              deal     surprise
## 23065              deal        trust
## 23066             quote anticipation
## 23067             quote     negative
## 23068             quote     positive
## 23069             quote     surprise
## 23070              wise     positive
## 23071            offset anticipation
## 23072            offset     positive
## 23073             worth     positive
## 23074            insane        anger
## 23075            insane         fear
## 23076            insane     negative
## 23077              ship anticipation
## 23078          military         fear
## 23079         guarantee     positive
## 23080         guarantee        trust
## 23081              ship anticipation
## 23082          military         fear
## 23083             argue        anger
## 23084             argue     negative
## 23085            afford     positive
## 23086              ship anticipation
## 23087             scare        anger
## 23088             scare anticipation
## 23089             scare         fear
## 23090             scare     negative
## 23091             scare     surprise
## 23092        impossible     negative
## 23093        impossible      sadness
## 23094        impossible     negative
## 23095        impossible      sadness
## 23096             money        anger
## 23097             money anticipation
## 23098             money          joy
## 23099             money     positive
## 23100             money     surprise
## 23101             money        trust
## 23102              cold     negative
## 23103            fusion     positive
## 23104        innovation     positive
## 23105              hate        anger
## 23106              hate      disgust
## 23107              hate         fear
## 23108              hate     negative
## 23109              hate      sadness
## 23110             money        anger
## 23111             money anticipation
## 23112             money          joy
## 23113             money     positive
## 23114             money     surprise
## 23115             money        trust
## 23116             money        anger
## 23117             money anticipation
## 23118             money          joy
## 23119             money     positive
## 23120             money     surprise
## 23121             money        trust
## 23122              bomb        anger
## 23123              bomb         fear
## 23124              bomb     negative
## 23125              bomb      sadness
## 23126              bomb     surprise
## 23127              wait anticipation
## 23128              wait     negative
## 23129              shed     negative
## 23130            mortal     negative
## 23131             folly     negative
## 23132              cold     negative
## 23133               war         fear
## 23134               war     negative
## 23135             spite        anger
## 23136             spite     negative
## 23137            cursed        anger
## 23138            cursed         fear
## 23139            cursed     negative
## 23140            cursed      sadness
## 23141            pretty anticipation
## 23142            pretty          joy
## 23143            pretty     positive
## 23144            pretty        trust
## 23145             crash         fear
## 23146             crash     negative
## 23147             crash      sadness
## 23148             crash     surprise
## 23149           killing        anger
## 23150           killing         fear
## 23151           killing     negative
## 23152           killing      sadness
## 23153           mistake     negative
## 23154           mistake      sadness
## 23155            coming anticipation
## 23156             crash         fear
## 23157             crash     negative
## 23158             crash      sadness
## 23159             crash     surprise
## 23160          mountain anticipation
## 23161         professor     positive
## 23162         professor        trust
## 23163            doctor     positive
## 23164            doctor        trust
## 23165          accident         fear
## 23166          accident     negative
## 23167          accident      sadness
## 23168          accident     surprise
## 23169            happen anticipation
## 23170             noble     positive
## 23171             noble        trust
## 23172        technology     positive
## 23173              true          joy
## 23174              true     positive
## 23175              true        trust
## 23176            reason     positive
## 23177        government         fear
## 23178        government     negative
## 23179             focus     positive
## 23180            fusion     positive
## 23181             armed        anger
## 23182             armed         fear
## 23183             armed     negative
## 23184             armed     positive
## 23185          shortage        anger
## 23186          shortage         fear
## 23187          shortage     negative
## 23188          shortage      sadness
## 23189            afford     positive
## 23190              team        trust
## 23191            combat        anger
## 23192            combat         fear
## 23193            combat     negative
## 23194             ready anticipation
## 23195            crusty      disgust
## 23196            crusty     negative
## 23197            poorly     negative
## 23198               ill        anger
## 23199               ill      disgust
## 23200               ill         fear
## 23201               ill     negative
## 23202               ill      sadness
## 23203             armed        anger
## 23204             armed         fear
## 23205             armed     negative
## 23206             armed     positive
## 23207             armed        anger
## 23208             armed         fear
## 23209             armed     negative
## 23210             armed     positive
## 23211              hire anticipation
## 23212              hire          joy
## 23213              hire     positive
## 23214              hire        trust
## 23215             armed        anger
## 23216             armed         fear
## 23217             armed     negative
## 23218             armed     positive
## 23219              pick     positive
## 23220            happen anticipation
## 23221             board anticipation
## 23222       distinction     positive
## 23223              crew        trust
## 23224             armed        anger
## 23225             armed         fear
## 23226             armed     negative
## 23227             armed     positive
## 23228              time anticipation
## 23229           feeling        anger
## 23230           feeling anticipation
## 23231           feeling      disgust
## 23232           feeling         fear
## 23233           feeling          joy
## 23234           feeling     negative
## 23235           feeling     positive
## 23236           feeling      sadness
## 23237           feeling     surprise
## 23238           feeling        trust
## 23239              shit        anger
## 23240              shit      disgust
## 23241              shit     negative
## 23242              crew        trust
## 23243         emergency         fear
## 23244         emergency     negative
## 23245         emergency      sadness
## 23246         emergency     surprise
## 23247        contraband        anger
## 23248        contraband      disgust
## 23249        contraband         fear
## 23250        contraband     negative
## 23251             armed        anger
## 23252             armed         fear
## 23253             armed     negative
## 23254             armed     positive
## 23255              kill         fear
## 23256              kill     negative
## 23257              kill      sadness
## 23258           capture     negative
## 23259             armed        anger
## 23260             armed         fear
## 23261             armed     negative
## 23262             armed     positive
## 23263        remarkably     positive
## 23264             naive     negative
## 23265         untrained     negative
## 23266             rusty     negative
## 23267               top anticipation
## 23268               top     positive
## 23269               top        trust
## 23270              ship anticipation
## 23271            chance     surprise
## 23272              hell        anger
## 23273              hell      disgust
## 23274              hell         fear
## 23275              hell     negative
## 23276              hell      sadness
## 23277           machine        trust
## 23278            stable     positive
## 23279            stable        trust
## 23280          question     positive
## 23281              safe          joy
## 23282              safe     positive
## 23283              safe        trust
## 23284              ship anticipation
## 23285             armed        anger
## 23286             armed         fear
## 23287             armed     negative
## 23288             armed     positive
## 23289            pirate        anger
## 23290            pirate     negative
## 23291              iron     positive
## 23292              iron        trust
## 23293               top anticipation
## 23294               top     positive
## 23295               top        trust
## 23296              ship anticipation
## 23297             armed        anger
## 23298             armed         fear
## 23299             armed     negative
## 23300             armed     positive
## 23301              hire anticipation
## 23302              hire          joy
## 23303              hire     positive
## 23304              hire        trust
## 23305            escort        trust
## 23306              real     positive
## 23307              real        trust
## 23308          powerful        anger
## 23309          powerful anticipation
## 23310          powerful      disgust
## 23311          powerful         fear
## 23312          powerful          joy
## 23313          powerful     positive
## 23314          powerful        trust
## 23315             armed        anger
## 23316             armed         fear
## 23317             armed     negative
## 23318             armed     positive
## 23319           defense        anger
## 23320           defense anticipation
## 23321           defense         fear
## 23322           defense     positive
## 23323            attack        anger
## 23324            attack         fear
## 23325            attack     negative
## 23326          defended     positive
## 23327          defended        trust
## 23328              ship anticipation
## 23329            nation        trust
## 23330             steal        anger
## 23331             steal         fear
## 23332             steal     negative
## 23333             steal      sadness
## 23334             dirty      disgust
## 23335             dirty     negative
## 23336              bomb        anger
## 23337              bomb         fear
## 23338              bomb     negative
## 23339              bomb      sadness
## 23340              bomb     surprise
## 23341              hide         fear
## 23342              ship anticipation
## 23343              shit        anger
## 23344              shit      disgust
## 23345              shit     negative
## 23346          military         fear
## 23347             force        anger
## 23348             force         fear
## 23349             force     negative
## 23350              ship anticipation
## 23351              harm         fear
## 23352              harm     negative
## 23353              lead     positive
## 23354              ship anticipation
## 23355             death        anger
## 23356             death anticipation
## 23357             death      disgust
## 23358             death         fear
## 23359             death     negative
## 23360             death      sadness
## 23361             death     surprise
## 23362            pirate        anger
## 23363            pirate     negative
## 23364              land     positive
## 23365              ship anticipation
## 23366           minimum     negative
## 23367            weight anticipation
## 23368            weight      disgust
## 23369            weight         fear
## 23370            weight          joy
## 23371            weight     negative
## 23372            weight     positive
## 23373            weight      sadness
## 23374            weight     surprise
## 23375            weight        trust
## 23376        determined     positive
## 23377              time anticipation
## 23378           foreign     negative
## 23379             happy anticipation
## 23380             happy          joy
## 23381             happy     positive
## 23382             happy        trust
## 23383             force        anger
## 23384             force         fear
## 23385             force     negative
## 23386             armed        anger
## 23387             armed         fear
## 23388             armed     negative
## 23389             armed     positive
## 23390             wrong     negative
## 23391        beneficial     positive
## 23392               bad        anger
## 23393               bad      disgust
## 23394               bad         fear
## 23395               bad     negative
## 23396               bad      sadness
## 23397              love          joy
## 23398              love     positive
## 23399      collectively     positive
## 23400      collectively        trust
## 23401              pull     positive
## 23402        proverbial     positive
## 23403               ass     negative
## 23404            option     positive
## 23405            marine        trust
## 23406            pretty anticipation
## 23407            pretty          joy
## 23408            pretty     positive
## 23409            pretty        trust
## 23410              late     negative
## 23411              late      sadness
## 23412              land     positive
## 23413              ship anticipation
## 23414            insane        anger
## 23415            insane         fear
## 23416            insane     negative
## 23417              safe          joy
## 23418              safe     positive
## 23419              safe        trust
## 23420              ship anticipation
## 23421            nation        trust
## 23422          military         fear
## 23423            launch anticipation
## 23424            launch     positive
## 23425            nation        trust
## 23426          military         fear
## 23427          military         fear
## 23428        technology     positive
## 23429              land     positive
## 23430             elite anticipation
## 23431             elite          joy
## 23432             elite     positive
## 23433             elite        trust
## 23434           special          joy
## 23435           special     positive
## 23436              ship anticipation
## 23437           special          joy
## 23438           special     positive
## 23439            nation        trust
## 23440          military         fear
## 23441            nation        trust
## 23442            piracy     negative
## 23443            pretty anticipation
## 23444            pretty          joy
## 23445            pretty     positive
## 23446            pretty        trust
## 23447             blast        anger
## 23448             blast         fear
## 23449             blast     negative
## 23450             blast     surprise
## 23451       radioactive         fear
## 23452       radioactive     negative
## 23453     contamination      disgust
## 23454     contamination     negative
## 23455            escape anticipation
## 23456            escape         fear
## 23457            escape     negative
## 23458            escape     positive
## 23459             coast     positive
## 23460             major     positive
## 23461       radioactive         fear
## 23462       radioactive     negative
## 23463       radioactive         fear
## 23464       radioactive     negative
## 23465         poisoning      disgust
## 23466         poisoning     negative
## 23467            supply     positive
## 23468             major     positive
## 23469            supply     positive
## 23470           useless     negative
## 23471             break     surprise
## 23472       radioactive         fear
## 23473       radioactive     negative
## 23474              bomb        anger
## 23475              bomb         fear
## 23476              bomb     negative
## 23477              bomb      sadness
## 23478              bomb     surprise
## 23479            choice     positive
## 23480       radioactive         fear
## 23481       radioactive     negative
## 23482         expertise     positive
## 23483         expertise        trust
## 23484              ship anticipation
## 23485            pretty anticipation
## 23486            pretty          joy
## 23487            pretty     positive
## 23488            pretty        trust
## 23489         expertise     positive
## 23490         expertise        trust
## 23491              bomb        anger
## 23492              bomb         fear
## 23493              bomb     negative
## 23494              bomb      sadness
## 23495              bomb     surprise
## 23496         existence     positive
## 23497            actual     positive
## 23498          military         fear
## 23499          military         fear
## 23500               war         fear
## 23501               war     negative
## 23502              love          joy
## 23503              love     positive
## 23504              boil      disgust
## 23505              boil     negative
## 23506           acquire     positive
## 23507             dirty      disgust
## 23508             dirty     negative
## 23509              bomb        anger
## 23510              bomb         fear
## 23511              bomb     negative
## 23512              bomb      sadness
## 23513              bomb     surprise
## 23514             worth     positive
## 23515            pretty anticipation
## 23516            pretty          joy
## 23517            pretty     positive
## 23518            pretty        trust
## 23519              ship anticipation
## 23520         expertise     positive
## 23521         expertise        trust
## 23522             major     positive
## 23523             build     positive
## 23524          detonate         fear
## 23525          detonate     negative
## 23526          detonate     surprise
## 23527           machine        trust
## 23528               gun        anger
## 23529               gun         fear
## 23530               gun     negative
## 23531              dust     negative
## 23532        detonation        anger
## 23533              real     positive
## 23534              real        trust
## 23535            poorly     negative
## 23536             start anticipation
## 23537           cutting        anger
## 23538           cutting      disgust
## 23539           cutting         fear
## 23540           cutting     negative
## 23541           cutting      sadness
## 23542             start anticipation
## 23543             cover        trust
## 23544             waste      disgust
## 23545             waste     negative
## 23546            poorly     negative
## 23547         radiation         fear
## 23548         radiation     negative
## 23549         radiation         fear
## 23550         radiation     negative
## 23551             crash         fear
## 23552             crash     negative
## 23553             crash      sadness
## 23554             crash     surprise
## 23555           prevent         fear
## 23556         radiation         fear
## 23557         radiation     negative
## 23558         radiation         fear
## 23559         radiation     negative
## 23560         radiation         fear
## 23561         radiation     negative
## 23562              sunk      disgust
## 23563              sunk         fear
## 23564              sunk     negative
## 23565              sunk      sadness
## 23566         radiation         fear
## 23567         radiation     negative
## 23568              leak     negative
## 23569           perfect anticipation
## 23570           perfect          joy
## 23571           perfect     positive
## 23572           perfect        trust
## 23573             crash         fear
## 23574             crash     negative
## 23575             crash      sadness
## 23576             crash     surprise
## 23577             major     positive
## 23578          accident         fear
## 23579          accident     negative
## 23580          accident      sadness
## 23581          accident     surprise
## 23582              ship anticipation
## 23583            happen anticipation
## 23584           worried     negative
## 23585           worried      sadness
## 23586               bad        anger
## 23587               bad      disgust
## 23588               bad         fear
## 23589               bad     negative
## 23590               bad      sadness
## 23591              land     positive
## 23592             avoid         fear
## 23593             avoid     negative
## 23594            happen anticipation
## 23595             start anticipation
## 23596             sense     positive
## 23597             store anticipation
## 23598             store     positive
## 23599             idiot      disgust
## 23600             idiot     negative
## 23601              leak     negative
## 23602            stable     positive
## 23603            stable        trust
## 23604             flood         fear
## 23605              ship anticipation
## 23606              harm         fear
## 23607              harm     negative
## 23608         shipwreck         fear
## 23609         shipwreck     negative
## 23610         shipwreck      sadness
## 23611           immense     positive
## 23612              time anticipation
## 23613              ship anticipation
## 23614              lost     negative
## 23615              lost      sadness
## 23616               sea     positive
## 23617              ship anticipation
## 23618           immense     positive
## 23619            happen anticipation
## 23620             fatal        anger
## 23621             fatal         fear
## 23622             fatal     negative
## 23623             fatal      sadness
## 23624              ship anticipation
## 23625             fatal        anger
## 23626             fatal         fear
## 23627             fatal     negative
## 23628             fatal      sadness
## 23629           harmful        anger
## 23630           harmful      disgust
## 23631           harmful         fear
## 23632           harmful     negative
## 23633           harmful      sadness
## 23634              ship anticipation
## 23635              leak     negative
## 23636           prevent         fear
## 23637        impossible     negative
## 23638        impossible      sadness
## 23639              leak     negative
## 23640         radiation         fear
## 23641         radiation     negative
## 23642             cheap     negative
## 23643              safe          joy
## 23644              safe     positive
## 23645              safe        trust
## 23646             level     positive
## 23647             level        trust
## 23648             bound     negative
## 23649             worth     positive
## 23650           ability     positive
## 23651            remove        anger
## 23652            remove         fear
## 23653            remove     negative
## 23654            remove      sadness
## 23655          assembly     positive
## 23656          assembly        trust
## 23657          distress        anger
## 23658          distress      disgust
## 23659          distress         fear
## 23660          distress     negative
## 23661          distress      sadness
## 23662          distress     surprise
## 23663               sea     positive
## 23664             sense     positive
## 23665           limited        anger
## 23666           limited     negative
## 23667           limited      sadness
## 23668         oversight     negative
## 23669      incompatible        anger
## 23670      incompatible      disgust
## 23671      incompatible     negative
## 23672      incompatible      sadness
## 23673            budget        trust
## 23674           captain     positive
## 23675            reason     positive
## 23676       corporation     positive
## 23677       corporation        trust
## 23678       maintenance        trust
## 23679              slip     negative
## 23680              slip     surprise
## 23681             fleet     positive
## 23682          military         fear
## 23683               pay anticipation
## 23684               pay          joy
## 23685               pay     positive
## 23686               pay        trust
## 23687       fundamental     positive
## 23688       fundamental        trust
## 23689        complexity     negative
## 23690        supporting     positive
## 23691        supporting        trust
## 23692          argument        anger
## 23693          argument     negative
## 23694             money        anger
## 23695             money anticipation
## 23696             money          joy
## 23697             money     positive
## 23698             money     surprise
## 23699             money        trust
## 23700               pay anticipation
## 23701               pay          joy
## 23702               pay     positive
## 23703               pay        trust
## 23704             calls anticipation
## 23705             calls     negative
## 23706             calls        trust
## 23707             board anticipation
## 23708              crew        trust
## 23709              crew        trust
## 23710          overpaid     negative
## 23711           subject     negative
## 23712               pay anticipation
## 23713               pay          joy
## 23714               pay     positive
## 23715               pay        trust
## 23716              crew        trust
## 23717             labor anticipation
## 23718             labor          joy
## 23719             labor     positive
## 23720             labor     surprise
## 23721             labor        trust
## 23722               pay anticipation
## 23723               pay          joy
## 23724               pay     positive
## 23725               pay        trust
## 23726               sea     positive
## 23727              time anticipation
## 23728               ass     negative
## 23729               pay anticipation
## 23730               pay          joy
## 23731               pay     positive
## 23732               pay        trust
## 23733               sea     positive
## 23734               pay anticipation
## 23735               pay          joy
## 23736               pay     positive
## 23737               pay        trust
## 23738         oversight     negative
## 23739        completely     positive
## 23740         oversight     negative
## 23741           worried     negative
## 23742           worried      sadness
## 23743             agree     positive
## 23744             sense     positive
## 23745       complicated     negative
## 23746         qualified     positive
## 23747         qualified        trust
## 23748               don     positive
## 23749               don        trust
## 23750        proficient     positive
## 23751        proficient        trust
## 23752          question     positive
## 23753            option     positive
## 23754             start anticipation
## 23755          learning     positive
## 23756        technology     positive
## 23757            reason     positive
## 23758              crew        trust
## 23759              slap        anger
## 23760              slap     negative
## 23761              slap     surprise
## 23762             extra     positive
## 23763               don     positive
## 23764               don        trust
## 23765         knowledge     positive
## 23766            happen anticipation
## 23767            change         fear
## 23768               sea     positive
## 23769         convinced        trust
## 23770             start anticipation
## 23771              ship anticipation
## 23772              ship anticipation
## 23773              grow anticipation
## 23774              grow          joy
## 23775              grow     positive
## 23776              grow        trust
## 23777        regulatory         fear
## 23778        regulatory     negative
## 23779         oversight     negative
## 23780        burdensome         fear
## 23781        burdensome     negative
## 23782        burdensome      sadness
## 23783        technology     positive
## 23784          electric          joy
## 23785          electric     positive
## 23786          electric     surprise
## 23787        technology     positive
## 23788          electric          joy
## 23789          electric     positive
## 23790          electric     surprise
## 23791           missing         fear
## 23792           missing     negative
## 23793           missing      sadness
## 23794          crippled     negative
## 23795          crippled      sadness
## 23796       radioactive         fear
## 23797       radioactive     negative
## 23798            bottom     negative
## 23799            bottom      sadness
## 23800         producing     positive
## 23801         radiation         fear
## 23802         radiation     negative
## 23803              leak     negative
## 23804              real     positive
## 23805              real        trust
## 23806              fair     positive
## 23807              sunk      disgust
## 23808              sunk         fear
## 23809              sunk     negative
## 23810              sunk      sadness
## 23811         radiation         fear
## 23812         radiation     negative
## 23813         radiation         fear
## 23814         radiation     negative
## 23815             wreck        anger
## 23816             wreck      disgust
## 23817             wreck         fear
## 23818             wreck     negative
## 23819             wreck      sadness
## 23820             wreck     surprise
## 23821         radiation         fear
## 23822         radiation     negative
## 23823         radiation         fear
## 23824         radiation     negative
## 23825       radioactive         fear
## 23826       radioactive     negative
## 23827            bottom     negative
## 23828            bottom      sadness
## 23829               bad        anger
## 23830               bad      disgust
## 23831               bad         fear
## 23832               bad     negative
## 23833               bad      sadness
## 23834             waste      disgust
## 23835             waste     negative
## 23836              shit        anger
## 23837              shit      disgust
## 23838              shit     negative
## 23839               don     positive
## 23840               don        trust
## 23841            bottom     negative
## 23842            bottom      sadness
## 23843              ship anticipation
## 23844              leak     negative
## 23845            harbor        trust
## 23846              sunk      disgust
## 23847              sunk         fear
## 23848              sunk     negative
## 23849              sunk      sadness
## 23850              seal     positive
## 23851              seal        trust
## 23852              leak     negative
## 23853            bottom     negative
## 23854            bottom      sadness
## 23855             waste      disgust
## 23856             waste     negative
## 23857             green          joy
## 23858             green     positive
## 23859             green        trust
## 23860               goo      disgust
## 23861               goo     negative
## 23862            poison        anger
## 23863            poison      disgust
## 23864            poison         fear
## 23865            poison     negative
## 23866            poison      sadness
## 23867            fairly     positive
## 23868            fairly        trust
## 23869              safe          joy
## 23870              safe     positive
## 23871              safe        trust
## 23872            expect anticipation
## 23873            expect     positive
## 23874            expect     surprise
## 23875            expect        trust
## 23876              harm         fear
## 23877              harm     negative
## 23878         radiation         fear
## 23879         radiation     negative
## 23880            damage        anger
## 23881            damage      disgust
## 23882            damage     negative
## 23883            damage      sadness
## 23884            mother anticipation
## 23885            mother          joy
## 23886            mother     negative
## 23887            mother     positive
## 23888            mother      sadness
## 23889            mother        trust
## 23890       coincidence     surprise
## 23891            create          joy
## 23892            create     positive
## 23893            reason     positive
## 23894            public anticipation
## 23895            public     positive
## 23896       electricity     positive
## 23897           reading     positive
## 23898      disagreement        anger
## 23899      disagreement     negative
## 23900      disagreement      sadness
## 23901         unpopular      disgust
## 23902         unpopular     negative
## 23903         unpopular      sadness
## 23904              hell        anger
## 23905              hell      disgust
## 23906              hell         fear
## 23907              hell     negative
## 23908              hell      sadness
## 23909              wait anticipation
## 23910              wait     negative
## 23911              crew        trust
## 23912             radio     positive
## 23913         surprised     surprise
## 23914            coming anticipation
## 23915              crew        trust
## 23916         emergency         fear
## 23917         emergency     negative
## 23918         emergency      sadness
## 23919         emergency     surprise
## 23920            system        trust
## 23921         demanding     negative
## 23922         attention     positive
## 23923             board anticipation
## 23924             agree     positive
## 23925           attempt anticipation
## 23926             sense     positive
## 23927            stupid     negative
## 23928            stupid     negative
## 23929            pretty anticipation
## 23930            pretty          joy
## 23931            pretty     positive
## 23932            pretty        trust
## 23933        technology     positive
## 23934              safe          joy
## 23935              safe     positive
## 23936              safe        trust
## 23937             clean          joy
## 23938             clean     positive
## 23939             clean        trust
## 23940          absolute     positive
## 23941           tragedy         fear
## 23942           tragedy     negative
## 23943           tragedy      sadness
## 23944              time anticipation
## 23945              hell        anger
## 23946              hell      disgust
## 23947              hell         fear
## 23948              hell     negative
## 23949              hell      sadness
## 23950              time anticipation
## 23951            coming anticipation
## 23952          scrutiny     negative
## 23953              lost     negative
## 23954              lost      sadness
## 23955              time anticipation
## 23956         dangerous         fear
## 23957         dangerous     negative
## 23958               don     positive
## 23959               don        trust
## 23960               sea     positive
## 23961            worthy     positive
## 23962            worthy        trust
## 23963          advanced     positive
## 23964        technology     positive
## 23965              ship anticipation
## 23966        structural        trust
## 23967            damage        anger
## 23968            damage      disgust
## 23969            damage     negative
## 23970            damage      sadness
## 23971          agreeing     positive
## 23972          agreeing        trust
## 23973        completely     positive
## 23974         efficient anticipation
## 23975         efficient     positive
## 23976         efficient        trust
## 23977            public anticipation
## 23978            public     positive
## 23979         radiation         fear
## 23980         radiation     negative
## 23981               don     positive
## 23982               don        trust
## 23983          argument        anger
## 23984          argument     negative
## 23985         efficient anticipation
## 23986         efficient     positive
## 23987         efficient        trust
## 23988            insult        anger
## 23989            insult      disgust
## 23990            insult     negative
## 23991            insult      sadness
## 23992            insult     surprise
## 23993              love          joy
## 23994              love     positive
## 23995               god anticipation
## 23996               god         fear
## 23997               god          joy
## 23998               god     positive
## 23999               god        trust
## 24000              joke     negative
## 24001             words        anger
## 24002             words     negative
## 24003         carefully     positive
## 24004              word     positive
## 24005              word        trust
## 24006         efficient anticipation
## 24007         efficient     positive
## 24008         efficient        trust
## 24009               don     positive
## 24010               don        trust
## 24011             doubt         fear
## 24012             doubt     negative
## 24013             doubt      sadness
## 24014             doubt        trust
## 24015        regulatory         fear
## 24016        regulatory     negative
## 24017         oversight     negative
## 24018        regulatory         fear
## 24019        regulatory     negative
## 24020         oversight     negative
## 24021          headache     negative
## 24022              deal anticipation
## 24023              deal          joy
## 24024              deal     positive
## 24025              deal     surprise
## 24026              deal        trust
## 24027              ship anticipation
## 24028              true          joy
## 24029              true     positive
## 24030              true        trust
## 24031              lack     negative
## 24032          building     positive
## 24033             cheap     negative
## 24034          incident     surprise
## 24035             erase         fear
## 24036             erase     negative
## 24037              ship anticipation
## 24038        impossible     negative
## 24039        impossible      sadness
## 24040             tough     negative
## 24041             tough      sadness
## 24042            reason     positive
## 24043             tough     negative
## 24044             tough      sadness
## 24045            public anticipation
## 24046            public     positive
## 24047          woefully      disgust
## 24048          woefully     negative
## 24049          woefully      sadness
## 24050             wrong     negative
## 24051         dangerous         fear
## 24052         dangerous     negative
## 24053         efficient anticipation
## 24054         efficient     positive
## 24055         efficient        trust
## 24056         producing     positive
## 24057             build     positive
## 24058             build     positive
## 24059        regulatory         fear
## 24060        regulatory     negative
## 24061             wrong     negative
## 24062             build     positive
## 24063         carefully     positive
## 24064             build     positive
## 24065             sense     positive
## 24066       electricity     positive
## 24067             sense     positive
## 24068         apologize     positive
## 24069         apologize      sadness
## 24070         apologize        trust
## 24071          childish     negative
## 24072               don     positive
## 24073               don        trust
## 24074            reason     positive
## 24075      disagreement        anger
## 24076      disagreement     negative
## 24077      disagreement      sadness
## 24078           subject     negative
## 24079         apologize     positive
## 24080         apologize      sadness
## 24081         apologize        trust
## 24082          argument        anger
## 24083          argument     negative
## 24084              land     positive
## 24085             build     positive
## 24086               sea     positive
## 24087             build     positive
## 24088              ship anticipation
## 24089          expenses     negative
## 24090             prove     positive
## 24091         efficient anticipation
## 24092         efficient     positive
## 24093         efficient        trust
## 24094               don     positive
## 24095               don        trust
## 24096         arguments        anger
## 24097         efficient anticipation
## 24098         efficient     positive
## 24099         efficient        trust
## 24100            proven        trust
## 24101            piracy     negative
## 24102              ship anticipation
## 24103              fall     negative
## 24104              fall      sadness
## 24105             wrong     negative
## 24106              time anticipation
## 24107            fusion     positive
## 24108            fusion     positive
## 24109        technology     positive
## 24110              land     positive
## 24111              crew        trust
## 24112              risk anticipation
## 24113              risk         fear
## 24114              risk     negative
## 24115          meltdown     negative
## 24116          meltdown      sadness
## 24117            fusion     positive
## 24118              plan anticipation
## 24119           economy        trust
## 24120          disagree        anger
## 24121          disagree     negative
## 24122             crude      disgust
## 24123             crude     negative
## 24124      distillation     positive
## 24125           remains      disgust
## 24126           remains         fear
## 24127           remains     negative
## 24128           remains     positive
## 24129           remains        trust
## 24130          question     positive
## 24131           account        trust
## 24132              ship anticipation
## 24133            reason     positive
## 24134           pollute      disgust
## 24135           pollute     negative
## 24136              lack     negative
## 24137         pollution      disgust
## 24138         pollution     negative
## 24139               don     positive
## 24140               don        trust
## 24141          disagree        anger
## 24142          disagree     negative
## 24143              time anticipation
## 24144       maintenance        trust
## 24145              ship anticipation
## 24146              ship anticipation
## 24147            ransom        anger
## 24148            ransom         fear
## 24149            ransom     negative
## 24150            threat        anger
## 24151            threat         fear
## 24152            threat     negative
## 24153             armed        anger
## 24154             armed         fear
## 24155             armed     negative
## 24156             armed     positive
## 24157             armed        anger
## 24158             armed         fear
## 24159             armed     negative
## 24160             armed     positive
## 24161            escort        trust
## 24162             board anticipation
## 24163             armed        anger
## 24164             armed         fear
## 24165             armed     negative
## 24166             armed     positive
## 24167         providing anticipation
## 24168         providing          joy
## 24169         providing     positive
## 24170         providing        trust
## 24171           finally anticipation
## 24172           finally      disgust
## 24173           finally          joy
## 24174           finally     positive
## 24175           finally     surprise
## 24176           finally        trust
## 24177           install anticipation
## 24178              deal anticipation
## 24179              deal          joy
## 24180              deal     positive
## 24181              deal     surprise
## 24182              deal        trust
## 24183              time anticipation
## 24184             money        anger
## 24185             money anticipation
## 24186             money          joy
## 24187             money     positive
## 24188             money     surprise
## 24189             money        trust
## 24190              hire anticipation
## 24191              hire          joy
## 24192              hire     positive
## 24193              hire        trust
## 24194           subject     negative
## 24195             usual     positive
## 24196             usual        trust
## 24197             money        anger
## 24198             money anticipation
## 24199             money          joy
## 24200             money     positive
## 24201             money     surprise
## 24202             money        trust
## 24203            piracy     negative
## 24204          argument        anger
## 24205          argument     negative
## 24206             sense     positive
## 24207             armed        anger
## 24208             armed         fear
## 24209             armed     negative
## 24210             armed     positive
## 24211             guard         fear
## 24212             guard     positive
## 24213             guard        trust
## 24214              ship anticipation
## 24215          leverage     positive
## 24216              ship anticipation
## 24217               hit        anger
## 24218               hit     negative
## 24219          military         fear
## 24220            bunker         fear
## 24221             shell        anger
## 24222             shell         fear
## 24223             shell     negative
## 24224             shell      sadness
## 24225             shell     surprise
## 24226              lead     positive
## 24227         radiation         fear
## 24228         radiation     negative
## 24229               die         fear
## 24230               die     negative
## 24231               die      sadness
## 24232           special          joy
## 24233           special     positive
## 24234             storm        anger
## 24235             storm     negative
## 24236              ship anticipation
## 24237         slaughter        anger
## 24238         slaughter      disgust
## 24239         slaughter         fear
## 24240         slaughter     negative
## 24241         slaughter      sadness
## 24242         slaughter     surprise
## 24243           beating        anger
## 24244           beating         fear
## 24245           beating     negative
## 24246           beating      sadness
## 24247             armed        anger
## 24248             armed         fear
## 24249             armed     negative
## 24250             armed     positive
## 24251              team        trust
## 24252           hurting        anger
## 24253           hurting         fear
## 24254           hurting     negative
## 24255           hurting      sadness
## 24256            larger      disgust
## 24257            larger     surprise
## 24258            larger        trust
## 24259           explode        anger
## 24260           explode         fear
## 24261           explode     negative
## 24262           explode      sadness
## 24263           explode     surprise
## 24264        impossible     negative
## 24265        impossible      sadness
## 24266              bomb        anger
## 24267              bomb         fear
## 24268              bomb     negative
## 24269              bomb      sadness
## 24270              bomb     surprise
## 24271          meltdown     negative
## 24272          meltdown      sadness
## 24273         explosion         fear
## 24274         explosion     negative
## 24275         explosion     surprise
## 24276             money        anger
## 24277             money anticipation
## 24278             money          joy
## 24279             money     positive
## 24280             money     surprise
## 24281             money        trust
## 24282               don     positive
## 24283               don        trust
## 24284              debt     negative
## 24285              debt      sadness
## 24286           immense     positive
## 24287            create          joy
## 24288            create     positive
## 24289         construct     positive
## 24290              ship anticipation
## 24291              crew        trust
## 24292             trade        trust
## 24293             trade        trust
## 24294         efficient anticipation
## 24295         efficient     positive
## 24296         efficient        trust
## 24297          continue anticipation
## 24298          continue     positive
## 24299          continue        trust
## 24300             money        anger
## 24301             money anticipation
## 24302             money          joy
## 24303             money     positive
## 24304             money     surprise
## 24305             money        trust
## 24306            change         fear
## 24307           related        trust
## 24308             worth     positive
## 24309            create          joy
## 24310            create     positive
## 24311             fleet     positive
## 24312          advanced     positive
## 24313             board anticipation
## 24314           benefit     positive
## 24315               bad        anger
## 24316               bad      disgust
## 24317               bad         fear
## 24318               bad     negative
## 24319               bad      sadness
## 24320            happen anticipation
## 24321              ship anticipation
## 24322           pollute      disgust
## 24323           pollute     negative
## 24324              hell        anger
## 24325              hell      disgust
## 24326              hell         fear
## 24327              hell     negative
## 24328              hell      sadness
## 24329              lost     negative
## 24330              lost      sadness
## 24331          military         fear
## 24332          military         fear
## 24333            degree     positive
## 24334              hell        anger
## 24335              hell      disgust
## 24336              hell         fear
## 24337              hell     negative
## 24338              hell      sadness
## 24339             flood         fear
## 24340              risk anticipation
## 24341              risk         fear
## 24342              risk     negative
## 24343            reason     positive
## 24344          scrutiny     negative
## 24345              rust     negative
## 24346              ship anticipation
## 24347           provide     positive
## 24348           provide        trust
## 24349          argument        anger
## 24350          argument     negative
## 24351            poorly     negative
## 24352              ship anticipation
## 24353          advanced     positive
## 24354              ship anticipation
## 24355          unstable         fear
## 24356          unstable     negative
## 24357          unstable     surprise
## 24358               sea     positive
## 24359              ship anticipation
## 24360        technology     positive
## 24361          advanced     positive
## 24362             cheap     negative
## 24363               don     positive
## 24364               don        trust
## 24365           stealth     surprise
## 24366               don     positive
## 24367               don        trust
## 24368            afford     positive
## 24369           prevent         fear
## 24370              ship anticipation
## 24371             force        anger
## 24372             force         fear
## 24373             force     negative
## 24374             force        anger
## 24375             force         fear
## 24376             force     negative
## 24377             peace anticipation
## 24378             peace          joy
## 24379             peace     positive
## 24380             peace        trust
## 24381        permission     positive
## 24382             death        anger
## 24383             death anticipation
## 24384             death      disgust
## 24385             death         fear
## 24386             death     negative
## 24387             death      sadness
## 24388             death     surprise
## 24389          sentence        anger
## 24390          sentence anticipation
## 24391          sentence      disgust
## 24392          sentence         fear
## 24393          sentence     negative
## 24394          sentence      sadness
## 24395               don     positive
## 24396               don        trust
## 24397             trust        trust
## 24398           special          joy
## 24399           special     positive
## 24400             storm        anger
## 24401             storm     negative
## 24402              ship anticipation
## 24403             cheap     negative
## 24404             sense     positive
## 24405               don     positive
## 24406               don        trust
## 24407             cheap     negative
## 24408        government         fear
## 24409        government     negative
## 24410             watch anticipation
## 24411             watch         fear
## 24412          disaster        anger
## 24413          disaster      disgust
## 24414          disaster         fear
## 24415          disaster     negative
## 24416          disaster      sadness
## 24417          disaster     surprise
## 24418            prison        anger
## 24419            prison         fear
## 24420            prison     negative
## 24421            prison      sadness
## 24422              rest     positive
## 24423               don     positive
## 24424               don        trust
## 24425             cheap     negative
## 24426         dangerous         fear
## 24427         dangerous     negative
## 24428            pretty anticipation
## 24429            pretty          joy
## 24430            pretty     positive
## 24431            pretty        trust
## 24432              land     positive
## 24433               sea     positive
## 24434            assets     positive
## 24435         ownership     positive
## 24436        ridiculous        anger
## 24437        ridiculous      disgust
## 24438        ridiculous     negative
## 24439              risk anticipation
## 24440              risk         fear
## 24441              risk     negative
## 24442               war         fear
## 24443               war     negative
## 24444           explain     positive
## 24445           explain        trust
## 24446           explain     positive
## 24447           explain        trust
## 24448           pretend     negative
## 24449            change         fear
## 24450              real     positive
## 24451              real        trust
## 24452            threat        anger
## 24453            threat         fear
## 24454            threat     negative
## 24455            change         fear
## 24456              real     positive
## 24457              real        trust
## 24458          constant     positive
## 24459          constant        trust
## 24460           explain     positive
## 24461           explain        trust
## 24462             major     positive
## 24463              shit        anger
## 24464              shit      disgust
## 24465              shit     negative
## 24466         radiation         fear
## 24467         radiation     negative
## 24468         radiation         fear
## 24469         radiation     negative
## 24470            bottom     negative
## 24471            bottom      sadness
## 24472           supreme     positive
## 24473         radiation         fear
## 24474         radiation     negative
## 24475            bottom     negative
## 24476            bottom      sadness
## 24477               don     positive
## 24478               don        trust
## 24479         effective     positive
## 24480         effective        trust
## 24481         radiation         fear
## 24482         radiation     negative
## 24483             start anticipation
## 24484             waste      disgust
## 24485             waste     negative
## 24486          drinking     negative
## 24487         radiation         fear
## 24488         radiation     negative
## 24489              safe          joy
## 24490              safe     positive
## 24491              safe        trust
## 24492       radioactive         fear
## 24493       radioactive     negative
## 24494          drinking     negative
## 24495         radiation         fear
## 24496         radiation     negative
## 24497       radioactive         fear
## 24498       radioactive     negative
## 24499          isolated         fear
## 24500          isolated     negative
## 24501          isolated      sadness
## 24502            buried         fear
## 24503            buried     negative
## 24504            buried      sadness
## 24505              fear        anger
## 24506              fear         fear
## 24507              fear     negative
## 24508          rational     positive
## 24509          rational        trust
## 24510               don     positive
## 24511               don        trust
## 24512             clean          joy
## 24513             clean     positive
## 24514             clean        trust
## 24515              plan anticipation
## 24516             title     positive
## 24517             title        trust
## 24518     argumentation        anger
## 24519           reading     positive
## 24520         efficient anticipation
## 24521         efficient     positive
## 24522         efficient        trust
## 24523         efficient anticipation
## 24524         efficient     positive
## 24525         efficient        trust
## 24526             civil     positive
## 24527          merchant        trust
## 24528            reason     positive
## 24529          building     positive
## 24530          merchant        trust
## 24531           convert     positive
## 24532          building     positive
## 24533              land     positive
## 24534          solution     positive
## 24535              real     positive
## 24536              real        trust
## 24537            public anticipation
## 24538            public     positive
## 24539            public anticipation
## 24540            public     positive
## 24541            outcry        anger
## 24542            outcry         fear
## 24543            outcry     negative
## 24544            outcry     surprise
## 24545           useless     negative
## 24546            proven        trust
## 24547         efficient anticipation
## 24548         efficient     positive
## 24549         efficient        trust
## 24550            public anticipation
## 24551            public     positive
## 24552             trust        trust
## 24553             fleet     positive
## 24554         radiation         fear
## 24555         radiation     negative
## 24556              leak     negative
## 24557             fixed        trust
## 24558             fleet     positive
## 24559         efficient anticipation
## 24560         efficient     positive
## 24561         efficient        trust
## 24562              ship anticipation
## 24563           shortly anticipation
## 24564       immediately anticipation
## 24565       immediately     negative
## 24566       immediately     positive
## 24567           refused     negative
## 24568           refused      sadness
## 24569              ship anticipation
## 24570              ship anticipation
## 24571          military         fear
## 24572          military         fear
## 24573               don     positive
## 24574               don        trust
## 24575             guess     surprise
## 24576              ship anticipation
## 24577       inefficient     negative
## 24578       inefficient      sadness
## 24579             shape     positive
## 24580             lines         fear
## 24581         difficult         fear
## 24582         passenger anticipation
## 24583             idiot      disgust
## 24584             idiot     negative
## 24585         radiation         fear
## 24586         radiation     negative
## 24587              safe          joy
## 24588              safe     positive
## 24589              safe        trust
## 24590            public anticipation
## 24591            public     positive
## 24592             trust        trust
## 24593         efficient anticipation
## 24594         efficient     positive
## 24595         efficient        trust
## 24596            public anticipation
## 24597            public     positive
## 24598            outcry        anger
## 24599            outcry         fear
## 24600            outcry     negative
## 24601            outcry     surprise
## 24602          disaster        anger
## 24603          disaster      disgust
## 24604          disaster         fear
## 24605          disaster     negative
## 24606          disaster      sadness
## 24607          disaster     surprise
## 24608            chance     surprise
## 24609             money        anger
## 24610             money anticipation
## 24611             money          joy
## 24612             money     positive
## 24613             money     surprise
## 24614             money        trust
## 24615          planning anticipation
## 24616          planning     positive
## 24617          planning        trust
## 24618          building     positive
## 24619            public anticipation
## 24620            public     positive
## 24621             trust        trust
## 24622              safe          joy
## 24623              safe     positive
## 24624              safe        trust
## 24625             doubt         fear
## 24626             doubt     negative
## 24627             doubt      sadness
## 24628             doubt        trust
## 24629              pull     positive
## 24630            demand        anger
## 24631            demand     negative
## 24632              lost     negative
## 24633              lost      sadness
## 24634              time anticipation
## 24635            stocks     negative
## 24636               job     positive
## 24637            sloppy      disgust
## 24638            sloppy     negative
## 24639             cheap     negative
## 24640            barred     negative
## 24641         unpopular      disgust
## 24642         unpopular     negative
## 24643         unpopular      sadness
## 24644          disagree        anger
## 24645          disagree     negative
## 24646              lose        anger
## 24647              lose      disgust
## 24648              lose         fear
## 24649              lose     negative
## 24650              lose      sadness
## 24651              lose     surprise
## 24652            margin     negative
## 24653            margin      sadness
## 24654            reason     positive
## 24655            public anticipation
## 24656            public     positive
## 24657             fleet     positive
## 24658              ship anticipation
## 24659              shit        anger
## 24660              shit      disgust
## 24661              shit     negative
## 24662              ship anticipation
## 24663              fear        anger
## 24664              fear         fear
## 24665              fear     negative
## 24666              land     positive
## 24667              fear        anger
## 24668              fear         fear
## 24669              fear     negative
## 24670             crash         fear
## 24671             crash     negative
## 24672             crash      sadness
## 24673             crash     surprise
## 24674         efficient anticipation
## 24675         efficient     positive
## 24676         efficient        trust
## 24677           fearful         fear
## 24678           fearful     negative
## 24679           fearful      sadness
## 24680             sense     positive
## 24681           patient anticipation
## 24682           patient     positive
## 24683           perfect anticipation
## 24684           perfect          joy
## 24685           perfect     positive
## 24686           perfect        trust
## 24687              ship anticipation
## 24688            insane        anger
## 24689            insane         fear
## 24690            insane     negative
## 24691              main     positive
## 24692         expertise     positive
## 24693         expertise        trust
## 24694             build     positive
## 24695              ship anticipation
## 24696              bomb        anger
## 24697              bomb         fear
## 24698              bomb     negative
## 24699              bomb      sadness
## 24700              bomb     surprise
## 24701              bore     negative
## 24702            change         fear
## 24703            marine        trust
## 24704            chance     surprise
## 24705           dispose      disgust
## 24706             board anticipation
## 24707           wishful anticipation
## 24708              land     positive
## 24709               bad        anger
## 24710               bad      disgust
## 24711               bad         fear
## 24712               bad     negative
## 24713               bad      sadness
## 24714               pay anticipation
## 24715               pay          joy
## 24716               pay     positive
## 24717               pay        trust
## 24718          merchant        trust
## 24719           install anticipation
## 24720             extra     positive
## 24721              time anticipation
## 24722            choice     positive
## 24723           install anticipation
## 24724               pay anticipation
## 24725               pay          joy
## 24726               pay     positive
## 24727               pay        trust
## 24728               bad        anger
## 24729               bad      disgust
## 24730               bad         fear
## 24731               bad     negative
## 24732               bad      sadness
## 24733       electricity     positive
## 24734              ship anticipation
## 24735       radioactive         fear
## 24736       radioactive     negative
## 24737            bottom     negative
## 24738            bottom      sadness
## 24739              safe          joy
## 24740              safe     positive
## 24741              safe        trust
## 24742             leave     negative
## 24743             leave      sadness
## 24744             leave     surprise
## 24745             crazy        anger
## 24746             crazy         fear
## 24747             crazy     negative
## 24748             crazy      sadness
## 24749             visit     positive
## 24750             wreck        anger
## 24751             wreck      disgust
## 24752             wreck         fear
## 24753             wreck     negative
## 24754             wreck      sadness
## 24755             wreck     surprise
## 24756              vote        anger
## 24757              vote anticipation
## 24758              vote          joy
## 24759              vote     negative
## 24760              vote     positive
## 24761              vote      sadness
## 24762              vote     surprise
## 24763              vote        trust
## 24764          solution     positive
## 24765              land     positive
## 24766              love          joy
## 24767              love     positive
## 24768            coming anticipation
## 24769             wrong     negative
## 24770           heavily     negative
## 24771             armed        anger
## 24772             armed         fear
## 24773             armed     negative
## 24774             armed     positive
## 24775             fight        anger
## 24776             fight         fear
## 24777             fight     negative
## 24778            threat        anger
## 24779            threat         fear
## 24780            threat     negative
## 24781              crew        trust
## 24782              ship anticipation
## 24783             armed        anger
## 24784             armed         fear
## 24785             armed     negative
## 24786             armed     positive
## 24787               top anticipation
## 24788               top     positive
## 24789               top        trust
## 24790              crew        trust
## 24791              lack     negative
## 24792              ship anticipation
## 24793            pretty anticipation
## 24794            pretty          joy
## 24795            pretty     positive
## 24796            pretty        trust
## 24797              shit        anger
## 24798              shit      disgust
## 24799              shit     negative
## 24800            danger         fear
## 24801            danger     negative
## 24802            danger      sadness
## 24803              real     positive
## 24804              real        trust
## 24805         oversight     negative
## 24806             wrong     negative
## 24807             major     positive
## 24808             agree     positive
## 24809        technology     positive
## 24810              safe          joy
## 24811              safe     positive
## 24812              safe        trust
## 24813          electric          joy
## 24814          electric     positive
## 24815          electric     surprise
## 24816             wrong     negative
## 24817             wrong     negative
## 24818             worry anticipation
## 24819             worry         fear
## 24820             worry     negative
## 24821             worry      sadness
## 24822             clock anticipation
## 24823              cool     positive
## 24824               pay anticipation
## 24825               pay          joy
## 24826               pay     positive
## 24827               pay        trust
## 24828             legal     positive
## 24829             legal        trust
## 24830          disaster        anger
## 24831          disaster      disgust
## 24832          disaster         fear
## 24833          disaster     negative
## 24834          disaster      sadness
## 24835          disaster     surprise
## 24836       maintenance        trust
## 24837          disaster        anger
## 24838          disaster      disgust
## 24839          disaster         fear
## 24840          disaster     negative
## 24841          disaster      sadness
## 24842          disaster     surprise
## 24843               cap anticipation
## 24844               cap        trust
## 24845               top anticipation
## 24846               top     positive
## 24847               top        trust
## 24848           capture     negative
## 24849             lower     negative
## 24850             lower      sadness
## 24851         pollution      disgust
## 24852         pollution     negative
## 24853               bad        anger
## 24854               bad      disgust
## 24855               bad         fear
## 24856               bad     negative
## 24857               bad      sadness
## 24858      intervention     negative
## 24859      intervention     positive
## 24860      intervention      sadness
## 24861            happen anticipation
## 24862             money        anger
## 24863             money anticipation
## 24864             money          joy
## 24865             money     positive
## 24866             money     surprise
## 24867             money        trust
## 24868          shortage        anger
## 24869          shortage         fear
## 24870          shortage     negative
## 24871          shortage      sadness
## 24872             trust        trust
## 24873            manage     positive
## 24874            manage        trust
## 24875              time anticipation
## 24876             lines         fear
## 24877         knowledge     positive
## 24878          advocate        trust
## 24879              real     positive
## 24880              real        trust
## 24881             troll        anger
## 24882             troll         fear
## 24883             troll     negative
## 24884          accounts        trust
## 24885            remove        anger
## 24886            remove         fear
## 24887            remove     negative
## 24888            remove      sadness
## 24889            speech     positive
## 24890            remove        anger
## 24891            remove         fear
## 24892            remove     negative
## 24893            remove      sadness
## 24894          accounts        trust
## 24895            public anticipation
## 24896            public     positive
## 24897            action     positive
## 24898           contact     positive
## 24899              cult         fear
## 24900              cult     negative
## 24901             truth     positive
## 24902             truth        trust
## 24903           hostile        anger
## 24904           hostile      disgust
## 24905           hostile         fear
## 24906           hostile     negative
## 24907           admirer     positive
## 24908           content          joy
## 24909           content     positive
## 24910           content        trust
## 24911           defense        anger
## 24912           defense anticipation
## 24913           defense         fear
## 24914           defense     positive
## 24915        completely     positive
## 24916              main     positive
## 24917            debate     positive
## 24918           despise        anger
## 24919           despise      disgust
## 24920           despise     negative
## 24921             crazy        anger
## 24922             crazy         fear
## 24923             crazy     negative
## 24924             crazy      sadness
## 24925          succinct     positive
## 24926        assessment     surprise
## 24927        assessment        trust
## 24928        completely     positive
## 24929      embarrassing     negative
## 24930             watch anticipation
## 24931             watch         fear
## 24932        unprepared     negative
## 24933             watch anticipation
## 24934             watch         fear
## 24935           horrors         fear
## 24936           horrors     negative
## 24937           horrors      sadness
## 24938         testament anticipation
## 24939         testament        trust
## 24940         suffering      disgust
## 24941         suffering         fear
## 24942         suffering     negative
## 24943         suffering      sadness
## 24944             found          joy
## 24945             found     positive
## 24946             found        trust
## 24947              rule         fear
## 24948              rule        trust
## 24949             doubt         fear
## 24950             doubt     negative
## 24951             doubt      sadness
## 24952             doubt        trust
## 24953           naughty     negative
## 24954              evil        anger
## 24955              evil      disgust
## 24956              evil         fear
## 24957              evil     negative
## 24958              evil      sadness
## 24959          violence        anger
## 24960          violence         fear
## 24961          violence     negative
## 24962          violence      sadness
## 24963            joking     positive
## 24964        playground anticipation
## 24965        playground          joy
## 24966        playground     positive
## 24967        playground     surprise
## 24968        playground        trust
## 24969          valuable     positive
## 24970            lesson anticipation
## 24971            lesson     positive
## 24972            lesson        trust
## 24973            insane        anger
## 24974            insane         fear
## 24975            insane     negative
## 24976            reason     positive
## 24977           protect     positive
## 24978           heinous     negative
## 24979        repression         fear
## 24980        repression     negative
## 24981             lines         fear
## 24982             lying        anger
## 24983             lying      disgust
## 24984             lying     negative
## 24985          disagree        anger
## 24986          disagree     negative
## 24987              meek      sadness
## 24988         testament anticipation
## 24989         testament        trust
## 24990               god anticipation
## 24991               god         fear
## 24992               god          joy
## 24993               god     positive
## 24994               god        trust
## 24995           jealous        anger
## 24996           jealous      disgust
## 24997           jealous     negative
## 24998        vindictive        anger
## 24999        vindictive      disgust
## 25000        vindictive     negative
## 25001           empathy     positive
## 25002              meek      sadness
## 25003           disdain        anger
## 25004           disdain      disgust
## 25005           disdain     negative
## 25006              join     positive
## 25007             sense     positive
## 25008     individuality     positive
## 25009           embrace anticipation
## 25010           embrace          joy
## 25011           embrace     positive
## 25012           embrace     surprise
## 25013           embrace        trust
## 25014            reason     positive
## 25015     contradiction     negative
## 25016           explain     positive
## 25017           explain        trust
## 25018              evil        anger
## 25019              evil      disgust
## 25020              evil         fear
## 25021              evil     negative
## 25022              evil      sadness
## 25023            hidden     negative
## 25024              evil        anger
## 25025              evil      disgust
## 25026              evil         fear
## 25027              evil     negative
## 25028              evil      sadness
## 25029          horrible        anger
## 25030          horrible      disgust
## 25031          horrible         fear
## 25032          horrible     negative
## 25033              real     positive
## 25034              real        trust
## 25035              evil        anger
## 25036              evil      disgust
## 25037              evil         fear
## 25038              evil     negative
## 25039              evil      sadness
## 25040             chaos        anger
## 25041             chaos         fear
## 25042             chaos     negative
## 25043             chaos      sadness
## 25044            knight     positive
## 25045         defending     positive
## 25046         admirable          joy
## 25047         admirable     positive
## 25048         admirable        trust
## 25049             chaos        anger
## 25050             chaos         fear
## 25051             chaos     negative
## 25052             chaos      sadness
## 25053         possessed        anger
## 25054         possessed      disgust
## 25055         possessed         fear
## 25056         possessed     negative
## 25057            occult      disgust
## 25058            occult         fear
## 25059            occult     negative
## 25060            reason     positive
## 25061           violent        anger
## 25062           violent      disgust
## 25063           violent         fear
## 25064           violent     negative
## 25065           violent     surprise
## 25066               god anticipation
## 25067               god         fear
## 25068               god          joy
## 25069               god     positive
## 25070               god        trust
## 25071            spirit     positive
## 25072           ancient     negative
## 25073               god anticipation
## 25074               god         fear
## 25075               god          joy
## 25076               god     positive
## 25077               god        trust
## 25078         possessed        anger
## 25079         possessed      disgust
## 25080         possessed         fear
## 25081         possessed     negative
## 25082           spirits anticipation
## 25083           spirits          joy
## 25084           spirits     positive
## 25085           spirits     surprise
## 25086              shit        anger
## 25087              shit      disgust
## 25088              shit     negative
## 25089            warped     negative
## 25090           magical anticipation
## 25091           magical          joy
## 25092           magical     positive
## 25093           magical     surprise
## 25094              task     positive
## 25095           prophet anticipation
## 25096           prophet     positive
## 25097           prophet        trust
## 25098              save          joy
## 25099              save     positive
## 25100              save        trust
## 25101             chaos        anger
## 25102             chaos         fear
## 25103             chaos     negative
## 25104             chaos      sadness
## 25105            warped     negative
## 25106           madness        anger
## 25107           madness         fear
## 25108           madness     negative
## 25109          disagree        anger
## 25110          disagree     negative
## 25111              meek      sadness
## 25112         testament anticipation
## 25113         testament        trust
## 25114               god anticipation
## 25115               god         fear
## 25116               god          joy
## 25117               god     positive
## 25118               god        trust
## 25119           jealous        anger
## 25120           jealous      disgust
## 25121           jealous     negative
## 25122        vindictive        anger
## 25123        vindictive      disgust
## 25124        vindictive     negative
## 25125           empathy     positive
## 25126              meek      sadness
## 25127              fair     positive
## 25128              fake     negative
## 25129           selfish        anger
## 25130           selfish      disgust
## 25131           selfish     negative
## 25132         aesthetic     positive
## 25133          politics        anger
## 25134             study     positive
## 25135         knowledge     positive
## 25136          favorite          joy
## 25137          favorite     positive
## 25138          favorite        trust
## 25139             watch anticipation
## 25140             watch         fear
## 25141              time anticipation
## 25142           subject     negative
## 25143            damage        anger
## 25144            damage      disgust
## 25145            damage     negative
## 25146            damage      sadness
## 25147            chosen     positive
## 25148          ultimate anticipation
## 25149          ultimate      sadness
## 25150           despise        anger
## 25151           despise      disgust
## 25152           despise     negative
## 25153              pity      sadness
## 25154             watch anticipation
## 25155             watch         fear
## 25156            oppose     negative
## 25157            stupid     negative
## 25158             argue        anger
## 25159             argue     negative
## 25160             waste      disgust
## 25161             waste     negative
## 25162              time anticipation
## 25163           wasting      disgust
## 25164           wasting         fear
## 25165           wasting     negative
## 25166           wasting      sadness
## 25167              time anticipation
## 25168             laugh          joy
## 25169             laugh     positive
## 25170             laugh     surprise
## 25171      intellectual     positive
## 25172             alive anticipation
## 25173             alive          joy
## 25174             alive     positive
## 25175             alive        trust
## 25176           sincere     positive
## 25177           sincere        trust
## 25178             daily anticipation
## 25179        propaganda     negative
## 25180             sadly     negative
## 25181             sadly      sadness
## 25182             watch anticipation
## 25183             watch         fear
## 25184          expected anticipation
## 25185              cult         fear
## 25186              cult     negative
## 25187           sincere     positive
## 25188           sincere        trust
## 25189              vote        anger
## 25190              vote anticipation
## 25191              vote          joy
## 25192              vote     negative
## 25193              vote     positive
## 25194              vote      sadness
## 25195              vote     surprise
## 25196              vote        trust
## 25197      intellectual     positive
## 25198             alive anticipation
## 25199             alive          joy
## 25200             alive     positive
## 25201             alive        trust
## 25202              vote        anger
## 25203              vote anticipation
## 25204              vote          joy
## 25205              vote     negative
## 25206              vote     positive
## 25207              vote      sadness
## 25208              vote     surprise
## 25209              vote        trust
## 25210      entertaining anticipation
## 25211      entertaining          joy
## 25212      entertaining     positive
## 25213             trump     surprise
## 25214           economy        trust
## 25215        depressing      disgust
## 25216        depressing     negative
## 25217        depressing      sadness
## 25218         ignorance     negative
## 25219             bliss          joy
## 25220             bliss     positive
## 25221            taught        trust
## 25222           hateful        anger
## 25223           hateful      disgust
## 25224           hateful         fear
## 25225           hateful     negative
## 25226           hateful      sadness
## 25227            crying     negative
## 25228            crying      sadness
## 25229             cider     positive
## 25230            pardon     positive
## 25231              love          joy
## 25232              love     positive
## 25233             toxic      disgust
## 25234             toxic     negative
## 25235             sense     positive
## 25236              word     positive
## 25237              word        trust
## 25238              lose        anger
## 25239              lose      disgust
## 25240              lose         fear
## 25241              lose     negative
## 25242              lose      sadness
## 25243              lose     surprise
## 25244            losing        anger
## 25245            losing     negative
## 25246            losing      sadness
## 25247              fill        trust
## 25248             badge        trust
## 25249             sense     positive
## 25250             child anticipation
## 25251             child          joy
## 25252             child     positive
## 25253       distraction     negative
## 25254           devious     negative
## 25255       unconscious     negative
## 25256         dangerous         fear
## 25257         dangerous     negative
## 25258      infiltration     negative
## 25259      infiltration     positive
## 25260           promise          joy
## 25261           promise     positive
## 25262           promise        trust
## 25263           serpent      disgust
## 25264           serpent         fear
## 25265           serpent     negative
## 25266             chaos        anger
## 25267             chaos         fear
## 25268             chaos     negative
## 25269             chaos      sadness
## 25270              lure     negative
## 25271           promise          joy
## 25272           promise     positive
## 25273           promise        trust
## 25274              skip     negative
## 25275              skip     negative
## 25276            reward anticipation
## 25277            reward          joy
## 25278            reward     positive
## 25279            reward     surprise
## 25280            reward        trust
## 25281          personal        trust
## 25282            reward anticipation
## 25283            reward          joy
## 25284            reward     positive
## 25285            reward     surprise
## 25286            reward        trust
## 25287             guess     surprise
## 25288               lie        anger
## 25289               lie      disgust
## 25290               lie     negative
## 25291               lie      sadness
## 25292              true          joy
## 25293              true     positive
## 25294              true        trust
## 25295              true          joy
## 25296              true     positive
## 25297              true        trust
## 25298              true          joy
## 25299              true     positive
## 25300              true        trust
## 25301         including     positive
## 25302          nonsense     negative
## 25303         dangerous         fear
## 25304         dangerous     negative
## 25305           gateway        trust
## 25306         existence     positive
## 25307              love          joy
## 25308              love     positive
## 25309            change         fear
## 25310            reward anticipation
## 25311            reward          joy
## 25312            reward     positive
## 25313            reward     surprise
## 25314            reward        trust
## 25315            result anticipation
## 25316             fight        anger
## 25317             fight         fear
## 25318             fight     negative
## 25319          ultimate anticipation
## 25320          ultimate      sadness
## 25321           freedom          joy
## 25322           freedom     positive
## 25323           freedom        trust
## 25324            system        trust
## 25325               pay anticipation
## 25326               pay          joy
## 25327               pay     positive
## 25328               pay        trust
## 25329          ultimate anticipation
## 25330          ultimate      sadness
## 25331           freedom          joy
## 25332           freedom     positive
## 25333           freedom        trust
## 25334            reward anticipation
## 25335            reward          joy
## 25336            reward     positive
## 25337            reward     surprise
## 25338            reward        trust
## 25339              hate        anger
## 25340              hate      disgust
## 25341              hate         fear
## 25342              hate     negative
## 25343              hate      sadness
## 25344              hate        anger
## 25345              hate      disgust
## 25346              hate         fear
## 25347              hate     negative
## 25348              hate      sadness
## 25349            busted        anger
## 25350            busted         fear
## 25351            busted     negative
## 25352              real     positive
## 25353              real        trust
## 25354              dumb     negative
## 25355              dumb     negative
## 25356              true          joy
## 25357              true     positive
## 25358              true        trust
## 25359             sense     positive
## 25360        incoherent     negative
## 25361        scientific     positive
## 25362        scientific        trust
## 25363             words        anger
## 25364             words     negative
## 25365          rational     positive
## 25366          rational        trust
## 25367         criticism        anger
## 25368         criticism     negative
## 25369         criticism      sadness
## 25370        impossible     negative
## 25371        impossible      sadness
## 25372            stupid     negative
## 25373             nasty        anger
## 25374             nasty      disgust
## 25375             nasty         fear
## 25376             nasty     negative
## 25377             nasty      sadness
## 25378          critique     positive
## 25379             wrong     negative
## 25380          critique     positive
## 25381          critique     positive
## 25382           evident     positive
## 25383           evident        trust
## 25384            theory anticipation
## 25385            theory        trust
## 25386              late     negative
## 25387              late      sadness
## 25388           pacific     positive
## 25389            brains     positive
## 25390          relevant     positive
## 25391          relevant        trust
## 25392           neglect     negative
## 25393             abuse        anger
## 25394             abuse      disgust
## 25395             abuse         fear
## 25396             abuse     negative
## 25397             abuse      sadness
## 25398             harry        anger
## 25399             harry     negative
## 25400             harry      sadness
## 25401               bad        anger
## 25402               bad      disgust
## 25403               bad         fear
## 25404               bad     negative
## 25405               bad      sadness
## 25406              shit        anger
## 25407              shit      disgust
## 25408              shit     negative
## 25409            chosen     positive
## 25410            chosen     positive
## 25411           payment     negative
## 25412            gifted     positive
## 25413             worse         fear
## 25414             worse     negative
## 25415             worse      sadness
## 25416           finally anticipation
## 25417           finally      disgust
## 25418           finally          joy
## 25419           finally     positive
## 25420           finally     surprise
## 25421           finally        trust
## 25422             crazy        anger
## 25423             crazy         fear
## 25424             crazy     negative
## 25425             crazy      sadness
## 25426           special          joy
## 25427           special     positive
## 25428              real     positive
## 25429              real        trust
## 25430             child anticipation
## 25431             child          joy
## 25432             child     positive
## 25433             abuse        anger
## 25434             abuse      disgust
## 25435             abuse         fear
## 25436             abuse     negative
## 25437             abuse      sadness
## 25438            taught        trust
## 25439             treat        anger
## 25440             treat anticipation
## 25441             treat      disgust
## 25442             treat         fear
## 25443             treat          joy
## 25444             treat     negative
## 25445             treat     positive
## 25446             treat      sadness
## 25447             treat     surprise
## 25448             treat        trust
## 25449            taught        trust
## 25450            taught        trust
## 25451       materialism     negative
## 25452           neglect     negative
## 25453             abuse        anger
## 25454             abuse      disgust
## 25455             abuse         fear
## 25456             abuse     negative
## 25457             abuse      sadness
## 25458               top anticipation
## 25459               top     positive
## 25460               top        trust
## 25461            unique     positive
## 25462            unique     surprise
## 25463            weight anticipation
## 25464            weight      disgust
## 25465            weight         fear
## 25466            weight          joy
## 25467            weight     negative
## 25468            weight     positive
## 25469            weight      sadness
## 25470            weight     surprise
## 25471            weight        trust
## 25472             child anticipation
## 25473             child          joy
## 25474             child     positive
## 25475               hit        anger
## 25476               hit     negative
## 25477             major     positive
## 25478              food          joy
## 25479              food     positive
## 25480              food        trust
## 25481       popularized     positive
## 25482              safe          joy
## 25483              safe     positive
## 25484              safe        trust
## 25485              hurt        anger
## 25486              hurt         fear
## 25487              hurt     negative
## 25488              hurt      sadness
## 25489            rescue anticipation
## 25490            rescue          joy
## 25491            rescue     positive
## 25492            rescue     surprise
## 25493            rescue        trust
## 25494            rescue anticipation
## 25495            rescue          joy
## 25496            rescue     positive
## 25497            rescue     surprise
## 25498            rescue        trust
## 25499             force        anger
## 25500             force         fear
## 25501             force     negative
## 25502           happily          joy
## 25503           happily     positive
## 25504             armed        anger
## 25505             armed         fear
## 25506             armed     negative
## 25507             armed     positive
## 25508            patrol        trust
## 25509    indoctrination        anger
## 25510    indoctrination         fear
## 25511    indoctrination     negative
## 25512          believed        trust
## 25513          physique     positive
## 25514        cultivated     positive
## 25515           ability     positive
## 25516         adversity        anger
## 25517         adversity         fear
## 25518         adversity     negative
## 25519         adversity      sadness
## 25520              hero anticipation
## 25521              hero          joy
## 25522              hero     positive
## 25523              hero     surprise
## 25524              hero        trust
## 25525          stripped        anger
## 25526          stripped anticipation
## 25527          stripped      disgust
## 25528          stripped         fear
## 25529          stripped     negative
## 25530          stripped      sadness
## 25531        conscience     positive
## 25532        conscience        trust
## 25533            doctor     positive
## 25534            doctor        trust
## 25535         existence     positive
## 25536             study     positive
## 25537              real     positive
## 25538              real        trust
## 25539              time anticipation
## 25540             study     positive
## 25541       intelligent     positive
## 25542       intelligent        trust
## 25543        university anticipation
## 25544        university     positive
## 25545         excellent          joy
## 25546         excellent     positive
## 25547         excellent        trust
## 25548          advanced     positive
## 25549          academic     positive
## 25550          academic        trust
## 25551         difficult         fear
## 25552             study     positive
## 25553           survive     positive
## 25554           horrors         fear
## 25555           horrors     negative
## 25556           horrors      sadness
## 25557              time anticipation
## 25558            degree     positive
## 25559            marvel     positive
## 25560            marvel     surprise
## 25561             alive anticipation
## 25562             alive          joy
## 25563             alive     positive
## 25564             alive        trust
## 25565            chosen     positive
## 25566             lucky          joy
## 25567             lucky     positive
## 25568             lucky     surprise
## 25569             faith anticipation
## 25570             faith          joy
## 25571             faith     positive
## 25572             faith        trust
## 25573              real     positive
## 25574              real        trust
## 25575         authority     positive
## 25576         authority        trust
## 25577          recovery     positive
## 25578         professor     positive
## 25579         professor        trust
## 25580              save          joy
## 25581              save     positive
## 25582              save        trust
## 25583              save          joy
## 25584              save     positive
## 25585              save        trust
## 25586              save          joy
## 25587              save     positive
## 25588              save        trust
## 25589            school        trust
## 25590              earn     positive
## 25591             money        anger
## 25592             money anticipation
## 25593             money          joy
## 25594             money     positive
## 25595             money     surprise
## 25596             money        trust
## 25597             share anticipation
## 25598             share          joy
## 25599             share     positive
## 25600             share        trust
## 25601             money        anger
## 25602             money anticipation
## 25603             money          joy
## 25604             money     positive
## 25605             money     surprise
## 25606             money        trust
## 25607           charity          joy
## 25608           charity     positive
## 25609             burnt      disgust
## 25610             burnt     negative
## 25611               job     positive
## 25612             money        anger
## 25613             money anticipation
## 25614             money          joy
## 25615             money     positive
## 25616             money     surprise
## 25617             money        trust
## 25618          believed        trust
## 25619             prove     positive
## 25620            worthy     positive
## 25621            worthy        trust
## 25622             child anticipation
## 25623             child          joy
## 25624             child     positive
## 25625               bad        anger
## 25626               bad      disgust
## 25627               bad         fear
## 25628               bad     negative
## 25629               bad      sadness
## 25630              lack     negative
## 25631          learning     positive
## 25632       expectation anticipation
## 25633       expectation     positive
## 25634            doctor     positive
## 25635            doctor        trust
## 25636         laughable      disgust
## 25637         laughable     negative
## 25638            degree     positive
## 25639             leave     negative
## 25640             leave      sadness
## 25641             leave     surprise
## 25642            degree     positive
## 25643              time anticipation
## 25644        management     positive
## 25645        management        trust
## 25646            stress     negative
## 25647           blindly     negative
## 25648           blindly      sadness
## 25649              hurt        anger
## 25650              hurt         fear
## 25651              hurt     negative
## 25652              hurt      sadness
## 25653            degree     positive
## 25654          relative        trust
## 25655            degree     positive
## 25656              cool     positive
## 25657            school        trust
## 25658         statement     positive
## 25659         statement        trust
## 25660            school        trust
## 25661            forced         fear
## 25662            forced     negative
## 25663            school        trust
## 25664           denying anticipation
## 25665           denying     negative
## 25666         existence     positive
## 25667            degree     positive
## 25668         supported     positive
## 25669              cult         fear
## 25670              cult     negative
## 25671               job     positive
## 25672              save          joy
## 25673              save     positive
## 25674              save        trust
## 25675               sin        anger
## 25676               sin      disgust
## 25677               sin         fear
## 25678               sin     negative
## 25679               sin      sadness
## 25680             spent     negative
## 25681              save          joy
## 25682              save     positive
## 25683              save        trust
## 25684        constantly        trust
## 25685           worried     negative
## 25686           worried      sadness
## 25687             fault     negative
## 25688             fault      sadness
## 25689         believing     positive
## 25690         believing        trust
## 25691            mother anticipation
## 25692            mother          joy
## 25693            mother     negative
## 25694            mother     positive
## 25695            mother      sadness
## 25696            mother        trust
## 25697            gifted     positive
## 25698             child anticipation
## 25699             child          joy
## 25700             child     positive
## 25701           achieve          joy
## 25702           achieve     positive
## 25703           achieve        trust
## 25704      overwhelming     positive
## 25705           feeling        anger
## 25706           feeling anticipation
## 25707           feeling      disgust
## 25708           feeling         fear
## 25709           feeling          joy
## 25710           feeling     negative
## 25711           feeling     positive
## 25712           feeling      sadness
## 25713           feeling     surprise
## 25714           feeling        trust
## 25715               job     positive
## 25716           succeed anticipation
## 25717           succeed          joy
## 25718           succeed     positive
## 25719           succeed     surprise
## 25720           succeed        trust
## 25721           failing        anger
## 25722           failing anticipation
## 25723           failing         fear
## 25724           failing     negative
## 25725           failing      sadness
## 25726              true          joy
## 25727              true     positive
## 25728              true        trust
## 25729              hate        anger
## 25730              hate      disgust
## 25731              hate         fear
## 25732              hate     negative
## 25733              hate      sadness
## 25734         recommend     positive
## 25735         recommend        trust
## 25736          politics        anger
## 25737         shattered     negative
## 25738         shattered      sadness
## 25739             worse         fear
## 25740             worse     negative
## 25741             worse      sadness
## 25742           worried     negative
## 25743           worried      sadness
## 25744               don     positive
## 25745               don        trust
## 25746         volunteer anticipation
## 25747         volunteer         fear
## 25748         volunteer          joy
## 25749         volunteer     positive
## 25750         volunteer        trust
## 25751           reading     positive
## 25752            change         fear
## 25753        inequality        anger
## 25754        inequality         fear
## 25755        inequality     negative
## 25756        inequality      sadness
## 25757           feeling        anger
## 25758           feeling anticipation
## 25759           feeling      disgust
## 25760           feeling         fear
## 25761           feeling          joy
## 25762           feeling     negative
## 25763           feeling     positive
## 25764           feeling      sadness
## 25765           feeling     surprise
## 25766           feeling        trust
## 25767            system        trust
## 25768           poverty        anger
## 25769           poverty      disgust
## 25770           poverty         fear
## 25771           poverty     negative
## 25772           poverty      sadness
## 25773              safe          joy
## 25774              safe     positive
## 25775              safe        trust
## 25776               don     positive
## 25777               don        trust
## 25778           deserve        anger
## 25779           deserve anticipation
## 25780           deserve     positive
## 25781           deserve        trust
## 25782       materialism     negative
## 25783             child anticipation
## 25784             child          joy
## 25785             child     positive
## 25786           slavery        anger
## 25787           slavery      disgust
## 25788           slavery         fear
## 25789           slavery     negative
## 25790           slavery      sadness
## 25791            advice        trust
## 25792           enforce        anger
## 25793           enforce         fear
## 25794           enforce     negative
## 25795           enforce     positive
## 25796             toxic      disgust
## 25797             toxic     negative
## 25798             shame      disgust
## 25799             shame         fear
## 25800             shame     negative
## 25801             shame      sadness
## 25802               bad        anger
## 25803               bad      disgust
## 25804               bad         fear
## 25805               bad     negative
## 25806               bad      sadness
## 25807              fear        anger
## 25808              fear         fear
## 25809              fear     negative
## 25810             shame      disgust
## 25811             shame         fear
## 25812             shame     negative
## 25813             shame      sadness
## 25814              fear        anger
## 25815              fear         fear
## 25816              fear     negative
## 25817             alarm         fear
## 25818             alarm     negative
## 25819             alarm     surprise
## 25820              lack     negative
## 25821          politics        anger
## 25822             shape     positive
## 25823              jail         fear
## 25824              jail     negative
## 25825              jail      sadness
## 25826              word     positive
## 25827              word        trust
## 25828          engaging          joy
## 25829          engaging     positive
## 25830          engaging        trust
## 25831          politics        anger
## 25832          relevant     positive
## 25833          relevant        trust
## 25834              hope anticipation
## 25835              hope          joy
## 25836              hope     positive
## 25837              hope     surprise
## 25838              hope        trust
## 25839          favorite          joy
## 25840          favorite     positive
## 25841          favorite        trust
## 25842              talk     positive
## 25843           feeling        anger
## 25844           feeling anticipation
## 25845           feeling      disgust
## 25846           feeling         fear
## 25847           feeling          joy
## 25848           feeling     negative
## 25849           feeling     positive
## 25850           feeling      sadness
## 25851           feeling     surprise
## 25852           feeling        trust
## 25853            guilty        anger
## 25854            guilty     negative
## 25855            guilty      sadness
## 25856            notion     positive
## 25857              join     positive
## 25858         rebellion        anger
## 25859         rebellion      disgust
## 25860         rebellion         fear
## 25861              cool     positive
## 25862               job     positive
## 25863          criminal        anger
## 25864          criminal      disgust
## 25865          criminal         fear
## 25866          criminal     negative
## 25867              cult         fear
## 25868              cult     negative
## 25869            taught        trust
## 25870              food          joy
## 25871              food     positive
## 25872              food        trust
## 25873               god anticipation
## 25874               god         fear
## 25875               god          joy
## 25876               god     positive
## 25877               god        trust
## 25878          pressure     negative
## 25879              cult         fear
## 25880              cult     negative
## 25881             extra     positive
## 25882        protective     positive
## 25883              time anticipation
## 25884            insane        anger
## 25885            insane         fear
## 25886            insane     negative
## 25887          agitated        anger
## 25888          agitated     negative
## 25889       intelligent     positive
## 25890       intelligent        trust
## 25891            police         fear
## 25892            police     positive
## 25893            police        trust
## 25894              time anticipation
## 25895            damage        anger
## 25896            damage      disgust
## 25897            damage     negative
## 25898            damage      sadness
## 25899             civil     positive
## 25900           knowing     positive
## 25901              evil        anger
## 25902              evil      disgust
## 25903              evil         fear
## 25904              evil     negative
## 25905              evil      sadness
## 25906             money        anger
## 25907             money anticipation
## 25908             money          joy
## 25909             money     positive
## 25910             money     surprise
## 25911             money        trust
## 25912             sense     positive
## 25913         effective     positive
## 25914         effective        trust
## 25915             found          joy
## 25916             found     positive
## 25917             found        trust
## 25918            prison        anger
## 25919            prison         fear
## 25920            prison     negative
## 25921            prison      sadness
## 25922         abolition     negative
## 25923          pressure     negative
## 25924         attention     positive
## 25925        accomplish          joy
## 25926        accomplish     positive
## 25927              jail         fear
## 25928              jail     negative
## 25929              jail      sadness
## 25930              jail         fear
## 25931              jail     negative
## 25932              jail      sadness
## 25933         rebellion        anger
## 25934         rebellion      disgust
## 25935         rebellion         fear
## 25936           illegal        anger
## 25937           illegal      disgust
## 25938           illegal         fear
## 25939           illegal     negative
## 25940           illegal      sadness
## 25941         dangerous         fear
## 25942         dangerous     negative
## 25943         protected        trust
## 25944             trust        trust
## 25945             trust        trust
## 25946             trust        trust
## 25947          solution     positive
## 25948              lack     negative
## 25949         knowledge     positive
## 25950              jump          joy
## 25951              jump     positive
## 25952              crap      disgust
## 25953              crap     negative
## 25954        accomplish          joy
## 25955        accomplish     positive
## 25956              wait anticipation
## 25957              wait     negative
## 25958              lack     negative
## 25959          increase     positive
## 25960           healing anticipation
## 25961           healing          joy
## 25962           healing     positive
## 25963           healing        trust
## 25964            policy        trust
## 25965          politics        anger
## 25966            option     positive
## 25967        impossible     negative
## 25968        impossible      sadness
## 25969             smile          joy
## 25970             smile     positive
## 25971             smile     surprise
## 25972             smile        trust
## 25973            change         fear
## 25974        contagious      disgust
## 25975        contagious         fear
## 25976        contagious     negative
## 25977             smile          joy
## 25978             smile     positive
## 25979             smile     surprise
## 25980             smile        trust
## 25981             smile          joy
## 25982             smile     positive
## 25983             smile     surprise
## 25984             smile        trust
## 25985             share anticipation
## 25986             share          joy
## 25987             share     positive
## 25988             share        trust
## 25989             smile          joy
## 25990             smile     positive
## 25991             smile     surprise
## 25992             smile        trust
## 25993             share anticipation
## 25994             share          joy
## 25995             share     positive
## 25996             share        trust
## 25997              hate        anger
## 25998              hate      disgust
## 25999              hate         fear
## 26000              hate     negative
## 26001              hate      sadness
## 26002              hate        anger
## 26003              hate      disgust
## 26004              hate         fear
## 26005              hate     negative
## 26006              hate      sadness
## 26007         advantage     positive
## 26008             smile          joy
## 26009             smile     positive
## 26010             smile     surprise
## 26011             smile        trust
## 26012              save          joy
## 26013              save     positive
## 26014              save        trust
## 26015              save          joy
## 26016              save     positive
## 26017              save        trust
## 26018          powerful        anger
## 26019          powerful anticipation
## 26020          powerful      disgust
## 26021          powerful         fear
## 26022          powerful          joy
## 26023          powerful     positive
## 26024          powerful        trust
## 26025            effort     positive
## 26026             smile          joy
## 26027             smile     positive
## 26028             smile     surprise
## 26029             smile        trust
## 26030             excel anticipation
## 26031             excel          joy
## 26032             excel     positive
## 26033             excel     surprise
## 26034             excel        trust
## 26035           success anticipation
## 26036           success          joy
## 26037           success     positive
## 26038             excel anticipation
## 26039             excel          joy
## 26040             excel     positive
## 26041             excel     surprise
## 26042             excel        trust
## 26043           subject     negative
## 26044       competition anticipation
## 26045       competition     negative
## 26046              fawn     negative
## 26047         authority     positive
## 26048         authority        trust
## 26049             sense     positive
## 26050             worth     positive
## 26051           ability     positive
## 26052         inability     negative
## 26053         inability      sadness
## 26054           feeling        anger
## 26055           feeling anticipation
## 26056           feeling      disgust
## 26057           feeling         fear
## 26058           feeling          joy
## 26059           feeling     negative
## 26060           feeling     positive
## 26061           feeling      sadness
## 26062           feeling     surprise
## 26063           feeling        trust
## 26064               don     positive
## 26065               don        trust
## 26066           deserve        anger
## 26067           deserve anticipation
## 26068           deserve     positive
## 26069           deserve        trust
## 26070              lack     negative
## 26071            unique     positive
## 26072            unique     surprise
## 26073             sense     positive
## 26074        distortion     negative
## 26075           hearing         fear
## 26076           hearing     negative
## 26077             share anticipation
## 26078             share          joy
## 26079             share     positive
## 26080             share        trust
## 26081            coming anticipation
## 26082              talk     positive
## 26083              time anticipation
## 26084             guess     surprise
## 26085             prove     positive
## 26086            father        trust
## 26087             worse         fear
## 26088             worse     negative
## 26089             worse      sadness
## 26090        university anticipation
## 26091        university     positive
## 26092          resident     positive
## 26093        constantly        trust
## 26094             found          joy
## 26095             found     positive
## 26096             found        trust
## 26097              deal anticipation
## 26098              deal          joy
## 26099              deal     positive
## 26100              deal     surprise
## 26101              deal        trust
## 26102        profession     positive
## 26103            doctor     positive
## 26104            doctor        trust
## 26105        profession     positive
## 26106        delusional        anger
## 26107        delusional         fear
## 26108        delusional     negative
## 26109         deference     positive
## 26110         deference        trust
## 26111              deal anticipation
## 26112              deal          joy
## 26113              deal     positive
## 26114              deal     surprise
## 26115              deal        trust
## 26116            friend          joy
## 26117            friend     positive
## 26118            friend        trust
## 26119            doctor     positive
## 26120            doctor        trust
## 26121            doctor     positive
## 26122            doctor        trust
## 26123             catch     surprise
## 26124       humiliation      disgust
## 26125       humiliation     negative
## 26126       humiliation      sadness
## 26127             youth        anger
## 26128             youth anticipation
## 26129             youth         fear
## 26130             youth          joy
## 26131             youth     positive
## 26132             youth     surprise
## 26133          convince anticipation
## 26134          convince     positive
## 26135          convince        trust
## 26136            doctor     positive
## 26137            doctor        trust
## 26138           genuine     positive
## 26139           genuine        trust
## 26140        passionate anticipation
## 26141        passionate          joy
## 26142        passionate     positive
## 26143        passionate        trust
## 26144              deal anticipation
## 26145              deal          joy
## 26146              deal     positive
## 26147              deal     surprise
## 26148              deal        trust
## 26149            doctor     positive
## 26150            doctor        trust
## 26151              talk     positive
## 26152               fun anticipation
## 26153               fun          joy
## 26154               fun     positive
## 26155          birthday anticipation
## 26156          birthday          joy
## 26157          birthday     positive
## 26158          birthday     surprise
## 26159            hungry anticipation
## 26160            hungry     negative
## 26161            cancer        anger
## 26162            cancer      disgust
## 26163            cancer         fear
## 26164            cancer     negative
## 26165            cancer      sadness
## 26166             peace anticipation
## 26167             peace          joy
## 26168             peace     positive
## 26169             peace        trust
## 26170        acceptable     positive
## 26171           selfish        anger
## 26172           selfish      disgust
## 26173           selfish     negative
## 26174             child anticipation
## 26175             child          joy
## 26176             child     positive
## 26177          expected anticipation
## 26178              save          joy
## 26179              save     positive
## 26180              save        trust
## 26181          expected anticipation
## 26182              time anticipation
## 26183            hidden     negative
## 26184           fulfill          joy
## 26185           fulfill     positive
## 26186            reason     positive
## 26187            honest        anger
## 26188            honest      disgust
## 26189            honest         fear
## 26190            honest          joy
## 26191            honest     positive
## 26192            honest      sadness
## 26193            honest        trust
## 26194           finally anticipation
## 26195           finally      disgust
## 26196           finally          joy
## 26197           finally     positive
## 26198           finally     surprise
## 26199           finally        trust
## 26200           brother     positive
## 26201           brother        trust
## 26202            doctor     positive
## 26203            doctor        trust
## 26204        successful anticipation
## 26205        successful          joy
## 26206        successful     positive
## 26207        successful        trust
## 26208            doctor     positive
## 26209            doctor        trust
## 26210            father        trust
## 26211            lawyer        anger
## 26212            lawyer      disgust
## 26213            lawyer         fear
## 26214            lawyer     negative
## 26215           fulfill          joy
## 26216           fulfill     positive
## 26217           holiday anticipation
## 26218           holiday          joy
## 26219           holiday     positive
## 26220            doctor     positive
## 26221            doctor        trust
## 26222          daughter          joy
## 26223          daughter     positive
## 26224          destined anticipation
## 26225            doctor     positive
## 26226            doctor        trust
## 26227            doctor     positive
## 26228            doctor        trust
## 26229         caretaker     positive
## 26230         caretaker        trust
## 26231              pain         fear
## 26232              pain     negative
## 26233              pain      sadness
## 26234        sympathize      sadness
## 26235           prevent         fear
## 26236             child anticipation
## 26237             child          joy
## 26238             child     positive
## 26239             worse         fear
## 26240             worse     negative
## 26241             worse      sadness
## 26242           helpful          joy
## 26243           helpful     positive
## 26244           helpful        trust
## 26245          balanced     positive
## 26246              save          joy
## 26247              save     positive
## 26248              save        trust
## 26249            crisis     negative
## 26250               top anticipation
## 26251               top     positive
## 26252               top        trust
## 26253        university anticipation
## 26254        university     positive
## 26255          suicidal        anger
## 26256          suicidal      disgust
## 26257          suicidal         fear
## 26258          suicidal     negative
## 26259          suicidal      sadness
## 26260           finally anticipation
## 26261           finally      disgust
## 26262           finally          joy
## 26263           finally     positive
## 26264           finally     surprise
## 26265           finally        trust
## 26266               top anticipation
## 26267               top     positive
## 26268               top        trust
## 26269        university anticipation
## 26270        university     positive
## 26271          suicidal        anger
## 26272          suicidal      disgust
## 26273          suicidal         fear
## 26274          suicidal     negative
## 26275          suicidal      sadness
## 26276            mother anticipation
## 26277            mother          joy
## 26278            mother     negative
## 26279            mother     positive
## 26280            mother      sadness
## 26281            mother        trust
## 26282           selfish        anger
## 26283           selfish      disgust
## 26284           selfish     negative
## 26285            doctor     positive
## 26286            doctor        trust
## 26287             broke         fear
## 26288             broke     negative
## 26289             broke      sadness
## 26290          disabled         fear
## 26291          disabled     negative
## 26292          disabled      sadness
## 26293            doctor     positive
## 26294            doctor        trust
## 26295         childhood          joy
## 26296         childhood     positive
## 26297        successful anticipation
## 26298        successful          joy
## 26299        successful     positive
## 26300        successful        trust
## 26301             wrong     negative
## 26302               joy          joy
## 26303               joy     positive
## 26304       unconscious     negative
## 26305              pain         fear
## 26306              pain     negative
## 26307              pain      sadness
## 26308          struggle        anger
## 26309          struggle         fear
## 26310          struggle     negative
## 26311          struggle      sadness
## 26312             shame      disgust
## 26313             shame         fear
## 26314             shame     negative
## 26315             shame      sadness
## 26316            happen anticipation
## 26317           frantic anticipation
## 26318           frantic      disgust
## 26319           frantic         fear
## 26320           frantic     negative
## 26321           frantic     surprise
## 26322          helpless         fear
## 26323          helpless     negative
## 26324          helpless      sadness
## 26325            escape anticipation
## 26326            escape         fear
## 26327            escape     negative
## 26328            escape     positive
## 26329         worthless        anger
## 26330         worthless      disgust
## 26331         worthless     negative
## 26332         worthless      sadness
## 26333        constantly        trust
## 26334             slave        anger
## 26335             slave         fear
## 26336             slave     negative
## 26337             slave      sadness
## 26338            master     positive
## 26339              whip        anger
## 26340              whip     negative
## 26341             ready anticipation
## 26342       unconscious     negative
## 26343           selfish        anger
## 26344           selfish      disgust
## 26345           selfish     negative
## 26346             extra     positive
## 26347         authority     positive
## 26348         authority        trust
## 26349            expert     positive
## 26350            expert        trust
## 26351            pretty anticipation
## 26352            pretty          joy
## 26353            pretty     positive
## 26354            pretty        trust
## 26355            change         fear
## 26356              hell        anger
## 26357              hell      disgust
## 26358              hell         fear
## 26359              hell     negative
## 26360              hell      sadness
## 26361               pay anticipation
## 26362               pay          joy
## 26363               pay     positive
## 26364               pay        trust
## 26365        thoughtful     positive
## 26366        thoughtful        trust
## 26367            action     positive
## 26368        profession     positive
## 26369            coming anticipation
## 26370           knowing     positive
## 26371              save          joy
## 26372              save     positive
## 26373              save        trust
## 26374          continue anticipation
## 26375          continue     positive
## 26376          continue        trust
## 26377            change         fear
## 26378       destruction        anger
## 26379       destruction     negative
## 26380               bad        anger
## 26381               bad      disgust
## 26382               bad         fear
## 26383               bad     negative
## 26384               bad      sadness
## 26385             money        anger
## 26386             money anticipation
## 26387             money          joy
## 26388             money     positive
## 26389             money     surprise
## 26390             money        trust
## 26391              real     positive
## 26392              real        trust
## 26393             abuse        anger
## 26394             abuse      disgust
## 26395             abuse         fear
## 26396             abuse     negative
## 26397             abuse      sadness
## 26398              real     positive
## 26399              real        trust
## 26400           develop anticipation
## 26401           develop     positive
## 26402             green          joy
## 26403             green     positive
## 26404             green        trust
## 26405           survive     positive
## 26406           knowing     positive
## 26407            forced         fear
## 26408            forced     negative
## 26409             child anticipation
## 26410             child          joy
## 26411             child     positive
## 26412         counselor     positive
## 26413         counselor        trust
## 26414        loneliness         fear
## 26415        loneliness     negative
## 26416        loneliness      sadness
## 26417         dependent     negative
## 26418         dependent     positive
## 26419         dependent        trust
## 26420             trick     negative
## 26421             trick     surprise
## 26422        disgusting        anger
## 26423        disgusting      disgust
## 26424        disgusting         fear
## 26425        disgusting     negative
## 26426        disgusting        anger
## 26427        disgusting      disgust
## 26428        disgusting         fear
## 26429        disgusting     negative
## 26430              cult         fear
## 26431              cult     negative
## 26432            taught        trust
## 26433              save          joy
## 26434              save     positive
## 26435              save        trust
## 26436         oppressor        anger
## 26437         oppressor         fear
## 26438         oppressor     negative
## 26439         oppressor      sadness
## 26440          doctrine        trust
## 26441              time anticipation
## 26442            taught        trust
## 26443       possibility anticipation
## 26444              shit        anger
## 26445              shit      disgust
## 26446              shit     negative
## 26447               job     positive
## 26448              shit        anger
## 26449              shit      disgust
## 26450              shit     negative
## 26451              shit        anger
## 26452              shit      disgust
## 26453              shit     negative
## 26454              shit        anger
## 26455              shit      disgust
## 26456              shit     negative
## 26457               die         fear
## 26458               die     negative
## 26459               die      sadness
## 26460             death        anger
## 26461             death anticipation
## 26462             death      disgust
## 26463             death         fear
## 26464             death     negative
## 26465             death      sadness
## 26466             death     surprise
## 26467            mother anticipation
## 26468            mother          joy
## 26469            mother     negative
## 26470            mother     positive
## 26471            mother      sadness
## 26472            mother        trust
## 26473           charity          joy
## 26474           charity     positive
## 26475            church anticipation
## 26476            church          joy
## 26477            church     positive
## 26478            church        trust
## 26479              save          joy
## 26480              save     positive
## 26481              save        trust
## 26482          virtuous          joy
## 26483          virtuous     positive
## 26484          virtuous        trust
## 26485              hero anticipation
## 26486              hero          joy
## 26487              hero     positive
## 26488              hero     surprise
## 26489              hero        trust
## 26490            heroic          joy
## 26491            heroic     positive
## 26492            heroic     surprise
## 26493            heroic        trust
## 26494             pious      disgust
## 26495             pious     positive
## 26496             pious      sadness
## 26497             pious        trust
## 26498             money        anger
## 26499             money anticipation
## 26500             money          joy
## 26501             money     positive
## 26502             money     surprise
## 26503             money        trust
## 26504            status     positive
## 26505            endure     positive
## 26506          inspired          joy
## 26507          inspired     positive
## 26508          inspired     surprise
## 26509          inspired        trust
## 26510          biblical     positive
## 26511          prophecy anticipation
## 26512            leader     positive
## 26513            leader        trust
## 26514               god anticipation
## 26515               god         fear
## 26516               god          joy
## 26517               god     positive
## 26518               god        trust
## 26519              lead     positive
## 26520            priest     positive
## 26521            priest        trust
## 26522            priest     positive
## 26523            priest        trust
## 26524            letter anticipation
## 26525           atheism     negative
## 26526       experienced     positive
## 26527       experienced        trust
## 26528             toxic      disgust
## 26529             toxic     negative
## 26530              time anticipation
## 26531               don     positive
## 26532               don        trust
## 26533              core     positive
## 26534             serve     negative
## 26535             serve        trust
## 26536           attempt anticipation
## 26537              rage        anger
## 26538              rage     negative
## 26539             watch anticipation
## 26540             watch         fear
## 26541             guilt      disgust
## 26542             guilt     negative
## 26543             guilt      sadness
## 26544            pretty anticipation
## 26545            pretty          joy
## 26546            pretty     positive
## 26547            pretty        trust
## 26548         community     positive
## 26549         community     positive
## 26550              joke     negative
## 26551            school        trust
## 26552              pick     positive
## 26553            doctor     positive
## 26554            doctor        trust
## 26555            lawyer        anger
## 26556            lawyer      disgust
## 26557            lawyer         fear
## 26558            lawyer     negative
## 26559            doctor     positive
## 26560            doctor        trust
## 26561            lawyer        anger
## 26562            lawyer      disgust
## 26563            lawyer         fear
## 26564            lawyer     negative
## 26565           benefit     positive
## 26566              lead     positive
## 26567             burnt      disgust
## 26568             burnt     negative
## 26569            afford     positive
## 26570         community     positive
## 26571           falling     negative
## 26572           falling      sadness
## 26573               job     positive
## 26574         entangled        anger
## 26575         entangled      disgust
## 26576         entangled         fear
## 26577         entangled     negative
## 26578         entangled      sadness
## 26579          morality     positive
## 26580          morality        trust
## 26581              save          joy
## 26582              save     positive
## 26583              save        trust
## 26584            expect anticipation
## 26585            expect     positive
## 26586            expect     surprise
## 26587            expect        trust
## 26588           achieve          joy
## 26589           achieve     positive
## 26590           achieve        trust
## 26591             worth     positive
## 26592            danger         fear
## 26593            danger     negative
## 26594            danger      sadness
## 26595            crisis     negative
## 26596           contact     positive
## 26597         emergency         fear
## 26598         emergency     negative
## 26599         emergency      sadness
## 26600         emergency     surprise
## 26601            crisis     negative
## 26602         resources          joy
## 26603         resources     positive
## 26604         resources        trust
## 26605         resources          joy
## 26606         resources     positive
## 26607         resources        trust
## 26608            action     positive
## 26609           contact     positive
## 26610              love          joy
## 26611              love     positive
## 26612              save          joy
## 26613              save     positive
## 26614              save        trust
## 26615            change         fear
## 26616              pain         fear
## 26617              pain     negative
## 26618              pain      sadness
## 26619               bad        anger
## 26620               bad      disgust
## 26621               bad         fear
## 26622               bad     negative
## 26623               bad      sadness
## 26624           illness         fear
## 26625           illness     negative
## 26626           illness      sadness
## 26627           ability     positive
## 26628            remove        anger
## 26629            remove         fear
## 26630            remove     negative
## 26631            remove      sadness
## 26632             child anticipation
## 26633             child          joy
## 26634             child     positive
## 26635            danger         fear
## 26636            danger     negative
## 26637            danger      sadness
## 26638         establish        trust
## 26639             sense     positive
## 26640             fight        anger
## 26641             fight         fear
## 26642             fight     negative
## 26643            unjust        anger
## 26644            unjust     negative
## 26645         authority     positive
## 26646         authority        trust
## 26647              seek anticipation
## 26648             upset        anger
## 26649             upset     negative
## 26650             upset      sadness
## 26651            unable     negative
## 26652            unable      sadness
## 26653          regulate     positive
## 26654        completely     positive
## 26655               job     positive
## 26656             fight        anger
## 26657             fight         fear
## 26658             fight     negative
## 26659              time anticipation
## 26660              save          joy
## 26661              save     positive
## 26662              save        trust
## 26663        unbearable      disgust
## 26664        unbearable     negative
## 26665        unbearable      sadness
## 26666             fight        anger
## 26667             fight         fear
## 26668             fight     negative
## 26669               don     positive
## 26670               don        trust
## 26671          conflict        anger
## 26672          conflict         fear
## 26673          conflict     negative
## 26674          conflict      sadness
## 26675             agree     positive
## 26676           opposed        anger
## 26677           opposed         fear
## 26678           opposed     negative
## 26679           empathy     positive
## 26680            reason     positive
## 26681               law        trust
## 26682           opposed        anger
## 26683           opposed         fear
## 26684           opposed     negative
## 26685          personal        trust
## 26686            suffer     negative
## 26687            reason     positive
## 26688              pain         fear
## 26689              pain     negative
## 26690              pain      sadness
## 26691              deal anticipation
## 26692              deal          joy
## 26693              deal     positive
## 26694              deal     surprise
## 26695              deal        trust
## 26696          destined anticipation
## 26697         including     positive
## 26698            coming anticipation
## 26699              bear        anger
## 26700              bear         fear
## 26701            coming anticipation
## 26702            reason     positive
## 26703         suffering      disgust
## 26704         suffering         fear
## 26705         suffering     negative
## 26706         suffering      sadness
## 26707           cruelty        anger
## 26708           cruelty      disgust
## 26709           cruelty         fear
## 26710           cruelty     negative
## 26711           cruelty      sadness
## 26712             break     surprise
## 26713              hope anticipation
## 26714              hope          joy
## 26715              hope     positive
## 26716              hope     surprise
## 26717              hope        trust
## 26718         counselor     positive
## 26719         counselor        trust
## 26720            career anticipation
## 26721            career     positive
## 26722             leave     negative
## 26723             leave      sadness
## 26724             leave     surprise
## 26725        profession     positive
## 26726            career anticipation
## 26727            career     positive
## 26728          creative     positive
## 26729          interior      disgust
## 26730          interior     positive
## 26731          interior        trust
## 26732          designer     positive
## 26733        impossible     negative
## 26734        impossible      sadness
## 26735         scientist anticipation
## 26736         scientist     positive
## 26737         scientist        trust
## 26738             sadly     negative
## 26739             sadly      sadness
## 26740        depression     negative
## 26741        depression      sadness
## 26742            public anticipation
## 26743            public     positive
## 26744           library     positive
## 26745            church anticipation
## 26746            church          joy
## 26747            church     positive
## 26748            church        trust
## 26749         expecting anticipation
## 26750          romantic anticipation
## 26751          romantic          joy
## 26752          romantic     positive
## 26753          romantic        trust
## 26754           partner     positive
## 26755             trash      disgust
## 26756             trash     negative
## 26757             trash      sadness
## 26758             waste      disgust
## 26759             waste     negative
## 26760        insecurity         fear
## 26761        insecurity     negative
## 26762             abuse        anger
## 26763             abuse      disgust
## 26764             abuse         fear
## 26765             abuse     negative
## 26766             abuse      sadness
## 26767        successful anticipation
## 26768        successful          joy
## 26769        successful     positive
## 26770        successful        trust
## 26771          nepotism        anger
## 26772          nepotism      disgust
## 26773          nepotism     negative
## 26774          nepotism      sadness
## 26775             merit     positive
## 26776             merit        trust
## 26777         recommend     positive
## 26778         recommend        trust
## 26779           related        trust
## 26780           helpful          joy
## 26781           helpful     positive
## 26782           helpful        trust
## 26783            coming anticipation
## 26784        journalist     positive
## 26785          politics        anger
## 26786           ability     positive
## 26787              kill         fear
## 26788              kill     negative
## 26789              kill      sadness
## 26790            guilty        anger
## 26791            guilty     negative
## 26792            guilty      sadness
## 26793             child anticipation
## 26794             child          joy
## 26795             child     positive
## 26796           perfect anticipation
## 26797           perfect          joy
## 26798           perfect     positive
## 26799           perfect        trust
## 26800              shit        anger
## 26801              shit      disgust
## 26802              shit     negative
## 26803             death        anger
## 26804             death anticipation
## 26805             death      disgust
## 26806             death         fear
## 26807             death     negative
## 26808             death      sadness
## 26809             death     surprise
## 26810            brains     positive
## 26811            pretty anticipation
## 26812            pretty          joy
## 26813            pretty     positive
## 26814            pretty        trust
## 26815         democracy     positive
## 26816             start anticipation
## 26817              base        trust
## 26818               cry     negative
## 26819               cry      sadness
## 26820            cancel     negative
## 26821            cancel      sadness
## 26822           culture     positive
## 26823          violence        anger
## 26824          violence         fear
## 26825          violence     negative
## 26826          violence      sadness
## 26827          threaten        anger
## 26828          threaten anticipation
## 26829          threaten         fear
## 26830          threaten     negative
## 26831          disagree        anger
## 26832          disagree     negative
## 26833             shoot        anger
## 26834             shoot         fear
## 26835             shoot     negative
## 26836          threaten        anger
## 26837          threaten anticipation
## 26838          threaten         fear
## 26839          threaten     negative
## 26840          threaten        anger
## 26841          threaten anticipation
## 26842          threaten         fear
## 26843          threaten     negative
## 26844             trump     surprise
## 26845             trump     surprise
## 26846             court        anger
## 26847             court anticipation
## 26848             court         fear
## 26849       threatening        anger
## 26850       threatening      disgust
## 26851       threatening         fear
## 26852       threatening     negative
## 26853          threaten        anger
## 26854          threaten anticipation
## 26855          threaten         fear
## 26856          threaten     negative
## 26857             civil     positive
## 26858               war         fear
## 26859               war     negative
## 26860          threaten        anger
## 26861          threaten anticipation
## 26862          threaten         fear
## 26863          threaten     negative
## 26864           suggest        trust
## 26865              wear     negative
## 26866              wear        trust
## 26867             death        anger
## 26868             death anticipation
## 26869             death      disgust
## 26870             death         fear
## 26871             death     negative
## 26872             death      sadness
## 26873             death     surprise
## 26874               cry     negative
## 26875               cry      sadness
## 26876            cancel     negative
## 26877            cancel      sadness
## 26878           culture     positive
## 26879          violence        anger
## 26880          violence         fear
## 26881          violence     negative
## 26882          violence      sadness
## 26883          threaten        anger
## 26884          threaten anticipation
## 26885          threaten         fear
## 26886          threaten     negative
## 26887          disagree        anger
## 26888          disagree     negative
## 26889       persecution        anger
## 26890       persecution      disgust
## 26891       persecution         fear
## 26892       persecution     negative
## 26893       persecution      sadness
## 26894        oppression        anger
## 26895        oppression      disgust
## 26896        oppression         fear
## 26897        oppression     negative
## 26898        oppression      sadness
## 26899             agree     positive
## 26900               job     positive
## 26901             fight        anger
## 26902             fight         fear
## 26903             fight     negative
## 26904           garbage      disgust
## 26905           garbage     negative
## 26906          humanity          joy
## 26907          humanity     positive
## 26908          humanity        trust
## 26909           perfect anticipation
## 26910           perfect          joy
## 26911           perfect     positive
## 26912           perfect        trust
## 26913        confession anticipation
## 26914        confession         fear
## 26915        confession     negative
## 26916        confession      sadness
## 26917        confession     surprise
## 26918         terrorist        anger
## 26919         terrorist      disgust
## 26920         terrorist         fear
## 26921         terrorist     negative
## 26922         terrorist      sadness
## 26923         terrorist     surprise
## 26924            threat        anger
## 26925            threat         fear
## 26926            threat     negative
## 26927          moderate     positive
## 26928              deal anticipation
## 26929              deal          joy
## 26930              deal     positive
## 26931              deal     surprise
## 26932              deal        trust
## 26933          superior     positive
## 26934             sense     positive
## 26935               bad        anger
## 26936               bad      disgust
## 26937               bad         fear
## 26938               bad     negative
## 26939               bad      sadness
## 26940            school        trust
## 26941            friend          joy
## 26942            friend     positive
## 26943            friend        trust
## 26944           liberal     negative
## 26945           liberal     positive
## 26946              time anticipation
## 26947         tasteless      disgust
## 26948         tasteless     negative
## 26949              fire         fear
## 26950            hating        anger
## 26951            hating     negative
## 26952              joke     negative
## 26953              time anticipation
## 26954              talk     positive
## 26955              tree        anger
## 26956              tree anticipation
## 26957              tree      disgust
## 26958              tree          joy
## 26959              tree     positive
## 26960              tree     surprise
## 26961              tree        trust
## 26962          shooting        anger
## 26963          shooting         fear
## 26964          shooting     negative
## 26965              lead     positive
## 26966          shooting        anger
## 26967          shooting         fear
## 26968          shooting     negative
## 26969              shit        anger
## 26970              shit      disgust
## 26971              shit     negative
## 26972              shit        anger
## 26973              shit      disgust
## 26974              shit     negative
## 26975           blatant        anger
## 26976           blatant      disgust
## 26977           blatant     negative
## 26978             shoot        anger
## 26979             shoot         fear
## 26980             shoot     negative
## 26981          threaten        anger
## 26982          threaten anticipation
## 26983          threaten         fear
## 26984          threaten     negative
## 26985           defense        anger
## 26986           defense anticipation
## 26987           defense         fear
## 26988           defense     positive
## 26989       corporation     positive
## 26990       corporation        trust
## 26991              rest     positive
## 26992            defend         fear
## 26993            defend     positive
## 26994       corporation     positive
## 26995       corporation        trust
## 26996           condone     positive
## 26997             start anticipation
## 26998             money        anger
## 26999             money anticipation
## 27000             money          joy
## 27001             money     positive
## 27002             money     surprise
## 27003             money        trust
## 27004              love          joy
## 27005              love     positive
## 27006           denying anticipation
## 27007           denying     negative
## 27008        conspiracy         fear
## 27009             blame        anger
## 27010             blame      disgust
## 27011             blame     negative
## 27012         hurricane         fear
## 27013         hurricane     negative
## 27014         existence     positive
## 27015              pray anticipation
## 27016              pray         fear
## 27017              pray          joy
## 27018              pray     positive
## 27019              pray     surprise
## 27020              pray        trust
## 27021               god anticipation
## 27022               god         fear
## 27023               god          joy
## 27024               god     positive
## 27025               god        trust
## 27026            cancer        anger
## 27027            cancer      disgust
## 27028            cancer         fear
## 27029            cancer     negative
## 27030            cancer      sadness
## 27031              pray anticipation
## 27032              pray         fear
## 27033              pray          joy
## 27034              pray     positive
## 27035              pray     surprise
## 27036              pray        trust
## 27037             fault     negative
## 27038             fault      sadness
## 27039             fault     negative
## 27040             fault      sadness
## 27041            giving     positive
## 27042         hurricane         fear
## 27043         hurricane     negative
## 27044               god anticipation
## 27045               god         fear
## 27046               god          joy
## 27047               god     positive
## 27048               god        trust
## 27049             fault     negative
## 27050             fault      sadness
## 27051              pray anticipation
## 27052              pray         fear
## 27053              pray          joy
## 27054              pray     positive
## 27055              pray     surprise
## 27056              pray        trust
## 27057             truth     positive
## 27058             truth        trust
## 27059             sadly     negative
## 27060             sadly      sadness
## 27061              hope anticipation
## 27062              hope          joy
## 27063              hope     positive
## 27064              hope     surprise
## 27065              hope        trust
## 27066           reading     positive
## 27067           predict anticipation
## 27068         hurricane         fear
## 27069         hurricane     negative
## 27070             trump     surprise
## 27071         hurricane         fear
## 27072         hurricane     negative
## 27073              dark      sadness
## 27074            resist     negative
## 27075         democracy     positive
## 27076             money        anger
## 27077             money anticipation
## 27078             money          joy
## 27079             money     positive
## 27080             money     surprise
## 27081             money        trust
## 27082           heavily     negative
## 27083        government         fear
## 27084        government     negative
## 27085        government         fear
## 27086        government     negative
## 27087       coincidence     surprise
## 27088        government         fear
## 27089        government     negative
## 27090    disinformation        anger
## 27091    disinformation         fear
## 27092    disinformation     negative
## 27093           machine        trust
## 27094         wonderful          joy
## 27095         wonderful     positive
## 27096         wonderful     surprise
## 27097         wonderful        trust
## 27098             major     positive
## 27099              talk     positive
## 27100           subject     negative
## 27101             radio     positive
## 27102      entertaining anticipation
## 27103      entertaining          joy
## 27104      entertaining     positive
## 27105             radio     positive
## 27106             watch anticipation
## 27107             watch         fear
## 27108        government         fear
## 27109        government     negative
## 27110              real     positive
## 27111              real        trust
## 27112             legal     positive
## 27113             legal        trust
## 27114       information     positive
## 27115             daily anticipation
## 27116              gold     positive
## 27117         gentleman     positive
## 27118         gentleman        trust
## 27119             hobby          joy
## 27120             hobby     positive
## 27121      professional     positive
## 27122      professional        trust
## 27123        journalism        trust
## 27124              lost     negative
## 27125              lost      sadness
## 27126             money        anger
## 27127             money anticipation
## 27128             money          joy
## 27129             money     positive
## 27130             money     surprise
## 27131             money        trust
## 27132              gold     positive
## 27133            coming anticipation
## 27134         democracy     positive
## 27135        journalism        trust
## 27136         democracy     positive
## 27137               hot        anger
## 27138          prepared anticipation
## 27139          prepared     positive
## 27140          prepared        trust
## 27141             money        anger
## 27142             money anticipation
## 27143             money          joy
## 27144             money     positive
## 27145             money     surprise
## 27146             money        trust
## 27147             mouth     surprise
## 27148               hit        anger
## 27149               hit     negative
## 27150          shooting        anger
## 27151          shooting         fear
## 27152          shooting     negative
## 27153         messenger        trust
## 27154             shoot        anger
## 27155             shoot         fear
## 27156             shoot     negative
## 27157              real     positive
## 27158              real        trust
## 27159            change         fear
## 27160            change         fear
## 27161         retention     positive
## 27162          football anticipation
## 27163          football          joy
## 27164          football     positive
## 27165               don     positive
## 27166               don        trust
## 27167        aesthetics          joy
## 27168        aesthetics     positive
## 27169              glad anticipation
## 27170              glad          joy
## 27171              glad     positive
## 27172        supporting     positive
## 27173        supporting        trust
## 27174             array     positive
## 27175             cover        trust
## 27176          electric          joy
## 27177          electric     positive
## 27178          electric     surprise
## 27179            luxury          joy
## 27180            luxury     positive
## 27181             worse         fear
## 27182             worse     negative
## 27183             worse      sadness
## 27184             found          joy
## 27185             found     positive
## 27186             found        trust
## 27187           success anticipation
## 27188           success          joy
## 27189           success     positive
## 27190               don     positive
## 27191               don        trust
## 27192               pay anticipation
## 27193               pay          joy
## 27194               pay     positive
## 27195               pay        trust
## 27196            excess     negative
## 27197            excess     negative
## 27198              time anticipation
## 27199       electricity     positive
## 27200            system        trust
## 27201              plan anticipation
## 27202               pay anticipation
## 27203               pay          joy
## 27204               pay     positive
## 27205               pay        trust
## 27206          electric          joy
## 27207          electric     positive
## 27208          electric     surprise
## 27209         producing     positive
## 27210             build     positive
## 27211          electric          joy
## 27212          electric     positive
## 27213          electric     surprise
## 27214          building     positive
## 27215            system        trust
## 27216         producing     positive
## 27217       electricity     positive
## 27218            system        trust
## 27219           perfect anticipation
## 27220           perfect          joy
## 27221           perfect     positive
## 27222           perfect        trust
## 27223             extra     positive
## 27224               hot        anger
## 27225            system        trust
## 27226         efficient anticipation
## 27227         efficient     positive
## 27228         efficient        trust
## 27229       electricity     positive
## 27230          expected anticipation
## 27231            pretty anticipation
## 27232            pretty          joy
## 27233            pretty     positive
## 27234            pretty        trust
## 27235        insulation        trust
## 27236              cash        anger
## 27237              cash anticipation
## 27238              cash         fear
## 27239              cash          joy
## 27240              cash     positive
## 27241              cash        trust
## 27242         excellent          joy
## 27243         excellent     positive
## 27244         excellent        trust
## 27245        undersized     negative
## 27246             array     positive
## 27247           limited        anger
## 27248           limited     negative
## 27249           limited      sadness
## 27250           limited        anger
## 27251           limited     negative
## 27252           limited      sadness
## 27253           tribune        trust
## 27254            change         fear
## 27255         dangerous         fear
## 27256         dangerous     negative
## 27257            degree     positive
## 27258              fort        trust
## 27259             worth     positive
## 27260         shattered     negative
## 27261         shattered      sadness
## 27262            change         fear
## 27263           tribune        trust
## 27264            broken        anger
## 27265            broken         fear
## 27266            broken     negative
## 27267            broken      sadness
## 27268           tribune        trust
## 27269             found          joy
## 27270             found     positive
## 27271             found        trust
## 27272              cold     negative
## 27273            change         fear
## 27274         dangerous         fear
## 27275         dangerous     negative
## 27276           killing        anger
## 27277           killing         fear
## 27278           killing     negative
## 27279           killing      sadness
## 27280           tribune        trust
## 27281             found          joy
## 27282             found     positive
## 27283             found        trust
## 27284           related        trust
## 27285           illness         fear
## 27286           illness     negative
## 27287           illness      sadness
## 27288            county        trust
## 27289          increase     positive
## 27290         scientist anticipation
## 27291         scientist     positive
## 27292         scientist        trust
## 27293            change         fear
## 27294     communication        trust
## 27295             guess     surprise
## 27296            denial     negative
## 27297        conspiracy         fear
## 27298              beer          joy
## 27299              beer     positive
## 27300          pavement        trust
## 27301           heavily     negative
## 27302             swear     positive
## 27303             swear        trust
## 27304             break     surprise
## 27305           predict anticipation
## 27306            august     positive
## 27307          majority          joy
## 27308          majority     positive
## 27309          majority        trust
## 27310        electorate        trust
## 27311             guess     surprise
## 27312               hot        anger
## 27313         hurricane         fear
## 27314         hurricane     negative
## 27315               hit        anger
## 27316               hit     negative
## 27317             coast     positive
## 27318            broken        anger
## 27319            broken         fear
## 27320            broken     negative
## 27321            broken      sadness
## 27322               bad        anger
## 27323               bad      disgust
## 27324               bad         fear
## 27325               bad     negative
## 27326               bad      sadness
## 27327             trend     positive
## 27328           asshole        anger
## 27329           asshole      disgust
## 27330           asshole     negative
## 27331              time anticipation
## 27332              deny        anger
## 27333              deny     negative
## 27334            change         fear
## 27335             storm        anger
## 27336             storm     negative
## 27337     unprecedented     surprise
## 27338            change         fear
## 27339              cold     negative
## 27340               don     positive
## 27341               don        trust
## 27342             worry anticipation
## 27343             worry         fear
## 27344             worry     negative
## 27345             worry      sadness
## 27346               don     positive
## 27347               don        trust
## 27348               rot      disgust
## 27349               rot         fear
## 27350               rot     negative
## 27351               rot      sadness
## 27352               bad        anger
## 27353               bad      disgust
## 27354               bad         fear
## 27355               bad     negative
## 27356               bad      sadness
## 27357        population     positive
## 27358           remains      disgust
## 27359           remains         fear
## 27360           remains     negative
## 27361           remains     positive
## 27362           remains        trust
## 27363              food          joy
## 27364              food     positive
## 27365              food        trust
## 27366           reading     positive
## 27367               bad        anger
## 27368               bad      disgust
## 27369               bad         fear
## 27370               bad     negative
## 27371               bad      sadness
## 27372           granted     positive
## 27373              hope anticipation
## 27374              hope          joy
## 27375              hope     positive
## 27376              hope     surprise
## 27377              hope        trust
## 27378            loving          joy
## 27379            loving     positive
## 27380            loving        trust
## 27381            change         fear
## 27382               hot        anger
## 27383            change         fear
## 27384          forecast anticipation
## 27385          forecast        trust
## 27386            school        trust
## 27387            absent     negative
## 27388            absent      sadness
## 27389              time anticipation
## 27390              time anticipation
## 27391              fits        anger
## 27392              fits     negative
## 27393               die         fear
## 27394               die     negative
## 27395               die      sadness
## 27396            strike        anger
## 27397            strike     negative
## 27398          suddenly     surprise
## 27399             guess     surprise
## 27400            change         fear
## 27401              real     positive
## 27402              real        trust
## 27403          question     positive
## 27404             brunt        anger
## 27405             brunt     negative
## 27406          tomorrow anticipation
## 27407   inconsequential     negative
## 27408   inconsequential      sadness
## 27409              hope anticipation
## 27410              hope          joy
## 27411              hope     positive
## 27412              hope     surprise
## 27413              hope        trust
## 27414              amen          joy
## 27415              amen     positive
## 27416              amen        trust
## 27417              talk     positive
## 27418            change         fear
## 27419            change         fear
## 27420         pollution      disgust
## 27421         pollution     negative
## 27422            happen anticipation
## 27423               sun anticipation
## 27424               sun          joy
## 27425               sun     positive
## 27426               sun     surprise
## 27427               sun        trust
## 27428           maximum     positive
## 27429               hit        anger
## 27430               hit     negative
## 27431         dangerous         fear
## 27432         dangerous     negative
## 27433           chaotic        anger
## 27434           chaotic     negative
## 27435         producing     positive
## 27436          forecast anticipation
## 27437          forecast        trust
## 27438            giving     positive
## 27439             green          joy
## 27440             green     positive
## 27441             green        trust
## 27442        lieutenant        trust
## 27443        propaganda     negative
## 27444             usual     positive
## 27445             usual        trust
## 27446             cross        anger
## 27447             cross         fear
## 27448             cross     negative
## 27449             cross      sadness
## 27450       opportunity anticipation
## 27451       opportunity     positive
## 27452             flesh      disgust
## 27453            choice     positive
## 27454            pretty anticipation
## 27455            pretty          joy
## 27456            pretty     positive
## 27457            pretty        trust
## 27458            action     positive
## 27459            reader     positive
## 27460         retention     positive
## 27461              time anticipation
## 27462              hope anticipation
## 27463              hope          joy
## 27464              hope     positive
## 27465              hope     surprise
## 27466              hope        trust
## 27467           special          joy
## 27468           special     positive
## 27469              time anticipation
## 27470             smith        trust
## 27471              fire         fear
## 27472              time anticipation
## 27473              hell        anger
## 27474              hell      disgust
## 27475              hell         fear
## 27476              hell     negative
## 27477              hell      sadness
## 27478         arguments        anger
## 27479     justification     positive
## 27480  incomprehensible     negative
## 27481             agree     positive
## 27482           tactics         fear
## 27483           tactics        trust
## 27484             level     positive
## 27485             level        trust
## 27486           logical     positive
## 27487          relevant     positive
## 27488          relevant        trust
## 27489             leave     negative
## 27490             leave      sadness
## 27491             leave     surprise
## 27492           logical     positive
## 27493        omniscient     positive
## 27494        omniscient        trust
## 27495            pretty anticipation
## 27496            pretty          joy
## 27497            pretty     positive
## 27498            pretty        trust
## 27499         arguments        anger
## 27500             quack      disgust
## 27501             quack     negative
## 27502           include     positive
## 27503          majestic anticipation
## 27504          majestic          joy
## 27505          majestic     positive
## 27506          majestic     surprise
## 27507          majestic        trust
## 27508          majestic anticipation
## 27509          majestic          joy
## 27510          majestic     positive
## 27511          majestic     surprise
## 27512          majestic        trust
## 27513          creature      disgust
## 27514          creature         fear
## 27515          creature     negative
## 27516              wait anticipation
## 27517              wait     negative
## 27518              time anticipation
## 27519               nap          joy
## 27520               nap     positive
## 27521         detention     negative
## 27522         detention      sadness
## 27523            chance     surprise
## 27524         detention     negative
## 27525         detention      sadness
## 27526              holy     positive
## 27527              shit        anger
## 27528              shit      disgust
## 27529              shit     negative
## 27530              cold     negative
## 27531              heal          joy
## 27532              heal     positive
## 27533              heal        trust
## 27534             treat        anger
## 27535             treat anticipation
## 27536             treat      disgust
## 27537             treat         fear
## 27538             treat          joy
## 27539             treat     negative
## 27540             treat     positive
## 27541             treat      sadness
## 27542             treat     surprise
## 27543             treat        trust
## 27544            attack        anger
## 27545            attack         fear
## 27546            attack     negative
## 27547          paranoia         fear
## 27548          paranoia     negative
## 27549            twitch     negative
## 27550            stress     negative
## 27551             guard         fear
## 27552             guard     positive
## 27553             guard        trust
## 27554           hanging        anger
## 27555           hanging      disgust
## 27556           hanging         fear
## 27557           hanging     negative
## 27558           hanging      sadness
## 27559           finally anticipation
## 27560           finally      disgust
## 27561           finally          joy
## 27562           finally     positive
## 27563           finally     surprise
## 27564           finally        trust
## 27565               bad        anger
## 27566               bad      disgust
## 27567               bad         fear
## 27568               bad     negative
## 27569               bad      sadness
## 27570          believed        trust
## 27571             wrong     negative
## 27572               lie        anger
## 27573               lie      disgust
## 27574               lie     negative
## 27575               lie      sadness
## 27576              time anticipation
## 27577              lack     negative
## 27578         believing     positive
## 27579         believing        trust
## 27580           success anticipation
## 27581           success          joy
## 27582           success     positive
## 27583              time anticipation
## 27584           captain     positive
## 27585          prestige          joy
## 27586          prestige     positive
## 27587          prestige        trust
## 27588             start anticipation
## 27589            guilty        anger
## 27590            guilty     negative
## 27591            guilty      sadness
## 27592           willful        anger
## 27593           willful     negative
## 27594           willful      sadness
## 27595         ignorance     negative
## 27596            forced         fear
## 27597            forced     negative
## 27598        conformity        trust
## 27599         poisonous        anger
## 27600         poisonous      disgust
## 27601         poisonous         fear
## 27602         poisonous     negative
## 27603         poisonous      sadness
## 27604         providing anticipation
## 27605         providing          joy
## 27606         providing     positive
## 27607         providing        trust
## 27608               don     positive
## 27609               don        trust
## 27610           comfort anticipation
## 27611           comfort          joy
## 27612           comfort     positive
## 27613           comfort        trust
## 27614             unity     positive
## 27615             unity        trust
## 27616      intelligence         fear
## 27617      intelligence          joy
## 27618      intelligence     positive
## 27619      intelligence        trust
## 27620           captain     positive
## 27621          convince anticipation
## 27622          convince     positive
## 27623          convince        trust
## 27624            regret     negative
## 27625            regret      sadness
## 27626           attempt anticipation
## 27627             visit     positive
## 27628           perfect anticipation
## 27629           perfect          joy
## 27630           perfect     positive
## 27631           perfect        trust
## 27632           approve          joy
## 27633           approve     positive
## 27634           approve        trust
## 27635              word     positive
## 27636              word        trust
## 27637              save          joy
## 27638              save     positive
## 27639              save        trust
## 27640              safe          joy
## 27641              safe     positive
## 27642              safe        trust
## 27643             spite        anger
## 27644             spite     negative
## 27645              time anticipation
## 27646             wrong     negative
## 27647              time anticipation
## 27648              word     positive
## 27649              word        trust
## 27650              save          joy
## 27651              save     positive
## 27652              save        trust
## 27653             wrong     negative
## 27654               bad        anger
## 27655               bad      disgust
## 27656               bad         fear
## 27657               bad     negative
## 27658               bad      sadness
## 27659          favorite          joy
## 27660          favorite     positive
## 27661          favorite        trust
## 27662              word     positive
## 27663              word        trust
## 27664              word     positive
## 27665              word        trust
## 27666            result anticipation
## 27667              word     positive
## 27668              word        trust
## 27669           special          joy
## 27670           special     positive
## 27671              word     positive
## 27672              word        trust
## 27673           special          joy
## 27674           special     positive
## 27675             waste      disgust
## 27676             waste     negative
## 27677           include     positive
## 27678              mess      disgust
## 27679              mess     negative
## 27680           include     positive
## 27681              word     positive
## 27682              word        trust
## 27683             trust        trust
## 27684           provide     positive
## 27685           provide        trust
## 27686            expert     positive
## 27687            expert        trust
## 27688              save          joy
## 27689              save     positive
## 27690              save        trust
## 27691              word     positive
## 27692              word        trust
## 27693              safe          joy
## 27694              safe     positive
## 27695              safe        trust
## 27696           passive     negative
## 27697              word     positive
## 27698              word        trust
## 27699            action     positive
## 27700              safe          joy
## 27701              safe     positive
## 27702              safe        trust
## 27703            action     positive
## 27704              rest     positive
## 27705             words        anger
## 27706             words     negative
## 27707              flow     positive
## 27708             happy anticipation
## 27709             happy          joy
## 27710             happy     positive
## 27711             happy        trust
## 27712        occasional     surprise
## 27713            misuse     negative
## 27714              word     positive
## 27715              word        trust
## 27716              luck anticipation
## 27717              luck          joy
## 27718              luck     positive
## 27719              luck     surprise
## 27720               job     positive
## 27721           hunting        anger
## 27722           hunting anticipation
## 27723           hunting         fear
## 27724           hunting     negative
## 27725              save          joy
## 27726              save     positive
## 27727              save        trust
## 27728              safe          joy
## 27729              safe     positive
## 27730              safe        trust
## 27731              hope anticipation
## 27732              hope          joy
## 27733              hope     positive
## 27734              hope     surprise
## 27735              hope        trust
## 27736               job     positive
## 27737          continue anticipation
## 27738          continue     positive
## 27739          continue        trust
## 27740           hopeful anticipation
## 27741           hopeful          joy
## 27742           hopeful     positive
## 27743           hopeful     surprise
## 27744           hopeful        trust
## 27745              talk     positive
## 27746        supporting     positive
## 27747        supporting        trust
## 27748             doubt         fear
## 27749             doubt     negative
## 27750             doubt      sadness
## 27751             doubt        trust
## 27752            honest        anger
## 27753            honest      disgust
## 27754            honest         fear
## 27755            honest          joy
## 27756            honest     positive
## 27757            honest      sadness
## 27758            honest        trust
## 27759          surprise         fear
## 27760          surprise          joy
## 27761          surprise     positive
## 27762          surprise     surprise
## 27763              time anticipation
## 27764              lead     positive
## 27765          military         fear
## 27766              save          joy
## 27767              save     positive
## 27768              save        trust
## 27769              safe          joy
## 27770              safe     positive
## 27771              safe        trust
## 27772              glad anticipation
## 27773              glad          joy
## 27774              glad     positive
## 27775              save          joy
## 27776              save     positive
## 27777              save        trust
## 27778              safe          joy
## 27779              safe     positive
## 27780              safe        trust
## 27781               hug          joy
## 27782               hug     positive
## 27783               hug        trust
## 27784              time anticipation
## 27785           subject     negative
## 27786         subscribe anticipation
## 27787         subscribe anticipation
## 27788              time anticipation
## 27789           subject     negative
## 27790           subject     negative
## 27791           subject     negative
## 27792         including     positive
## 27793               job     positive
## 27794               job     positive
## 27795               job     positive
## 27796               job     positive
## 27797               job     positive
## 27798               job     positive
## 27799               job     positive
## 27800               job     positive
## 27801               job     positive
## 27802               job     positive
## 27803               job     positive
## 27804               job     positive
## 27805               job     positive
## 27806               job     positive
## 27807               job     positive
## 27808               job     positive
## 27809               job     positive
## 27810               job     positive
## 27811               job     positive
## 27812               job     positive
## 27813            waffle        anger
## 27814            waffle     negative
## 27815            waffle      sadness
## 27816           subject     negative
## 27817            waffle        anger
## 27818            waffle     negative
## 27819            waffle      sadness
## 27820             start anticipation
## 27821              deal anticipation
## 27822              deal          joy
## 27823              deal     positive
## 27824              deal     surprise
## 27825              deal        trust
## 27826              word     positive
## 27827              word        trust
## 27828              word     positive
## 27829              word        trust
## 27830              save          joy
## 27831              save     positive
## 27832              save        trust
## 27833              word     positive
## 27834              word        trust
## 27835              safe          joy
## 27836              safe     positive
## 27837              safe        trust
## 27838              word     positive
## 27839              word        trust
## 27840              safe          joy
## 27841              safe     positive
## 27842              safe        trust
## 27843              save          joy
## 27844              save     positive
## 27845              save        trust
## 27846        impossible     negative
## 27847        impossible      sadness
## 27848              time anticipation
## 27849               law        trust
## 27850              safe          joy
## 27851              safe     positive
## 27852              safe        trust
## 27853              save          joy
## 27854              save     positive
## 27855              save        trust
## 27856              safe          joy
## 27857              safe     positive
## 27858              safe        trust
## 27859           finally anticipation
## 27860           finally      disgust
## 27861           finally          joy
## 27862           finally     positive
## 27863           finally     surprise
## 27864           finally        trust
## 27865              time anticipation
## 27866             learn     positive
## 27867           admiral     positive
## 27868           admiral        trust
## 27869             force        anger
## 27870             force         fear
## 27871             force     negative
## 27872         community     positive
## 27873             unity     positive
## 27874             unity        trust
## 27875            series        trust
## 27876              wait anticipation
## 27877              wait     negative
## 27878             visit     positive
## 27879            pretty anticipation
## 27880            pretty          joy
## 27881            pretty     positive
## 27882            pretty        trust
## 27883        correction     negative
## 27884        surprising     surprise
## 27885             depth     positive
## 27886             depth        trust
## 27887            poorly     negative
## 27888           mocking        anger
## 27889           mocking      disgust
## 27890           mocking     negative
## 27891           mocking      sadness
## 27892            virtue     positive
## 27893            virtue        trust
## 27894              wear     negative
## 27895              wear        trust
## 27896            ribbon        anger
## 27897            ribbon anticipation
## 27898            ribbon          joy
## 27899            ribbon     positive
## 27900          personal        trust
## 27901           beating        anger
## 27902           beating         fear
## 27903           beating     negative
## 27904           beating      sadness
## 27905            virtue     positive
## 27906            virtue        trust
## 27907         incorrect     negative
## 27908           loyalty     positive
## 27909           loyalty        trust
## 27910               bad        anger
## 27911               bad      disgust
## 27912               bad         fear
## 27913               bad     negative
## 27914               bad      sadness
## 27915          personal        trust
## 27916              gain anticipation
## 27917              gain          joy
## 27918              gain     positive
## 27919             noble     positive
## 27920             noble        trust
## 27921            virtue     positive
## 27922            virtue        trust
## 27923            virtue     positive
## 27924            virtue        trust
## 27925              vote        anger
## 27926              vote anticipation
## 27927              vote          joy
## 27928              vote     negative
## 27929              vote     positive
## 27930              vote      sadness
## 27931              vote     surprise
## 27932              vote        trust
## 27933         dangerous         fear
## 27934         dangerous     negative
## 27935            apathy     negative
## 27936            apathy      sadness
## 27937           loyalty     positive
## 27938           loyalty        trust
## 27939           loyalty     positive
## 27940           loyalty        trust
## 27941      professional     positive
## 27942      professional        trust
## 27943           praised          joy
## 27944           praised     positive
## 27945            career anticipation
## 27946            career     positive
## 27947            honest        anger
## 27948            honest      disgust
## 27949            honest         fear
## 27950            honest          joy
## 27951            honest     positive
## 27952            honest      sadness
## 27953            honest        trust
## 27954              hope anticipation
## 27955              hope          joy
## 27956              hope     positive
## 27957              hope     surprise
## 27958              hope        trust
## 27959          question     positive
## 27960               top anticipation
## 27961               top     positive
## 27962               top        trust
## 27963             found          joy
## 27964             found     positive
## 27965             found        trust
## 27966            pretty anticipation
## 27967            pretty          joy
## 27968            pretty     positive
## 27969            pretty        trust
## 27970             bigot        anger
## 27971             bigot      disgust
## 27972             bigot         fear
## 27973             bigot     negative
## 27974             broke         fear
## 27975             broke     negative
## 27976             broke      sadness
## 27977            change         fear
## 27978            pretty anticipation
## 27979            pretty          joy
## 27980            pretty     positive
## 27981            pretty        trust
## 27982               bad        anger
## 27983               bad      disgust
## 27984               bad         fear
## 27985               bad     negative
## 27986               bad      sadness
## 27987       information     positive
## 27988            pretty anticipation
## 27989            pretty          joy
## 27990            pretty     positive
## 27991            pretty        trust
## 27992          gullible     negative
## 27993          gullible      sadness
## 27994          gullible        trust
## 27995            unable     negative
## 27996            unable      sadness
## 27997              risk anticipation
## 27998              risk         fear
## 27999              risk     negative
## 28000            virtue     positive
## 28001            virtue        trust
## 28002            virtue     positive
## 28003            virtue        trust
## 28004         ignorance     negative
## 28005            virtue     positive
## 28006            virtue        trust
## 28007            virtue     positive
## 28008            virtue        trust
## 28009         ignorance     negative
## 28010              fair     positive
## 28011           suspect         fear
## 28012           suspect     negative
## 28013            virtue     positive
## 28014            virtue        trust
## 28015            choice     positive
## 28016             words        anger
## 28017             words     negative
## 28018           obvious     positive
## 28019           obvious        trust
## 28020              deal anticipation
## 28021              deal          joy
## 28022              deal     positive
## 28023              deal     surprise
## 28024              deal        trust
## 28025           chicken         fear
## 28026               don     positive
## 28027               don        trust
## 28028               don     positive
## 28029               don        trust
## 28030        passionate anticipation
## 28031        passionate          joy
## 28032        passionate     positive
## 28033        passionate        trust
## 28034             hobby          joy
## 28035             hobby     positive
## 28036          majority          joy
## 28037          majority     positive
## 28038          majority        trust
## 28039            beauty          joy
## 28040            beauty     positive
## 28041           related        trust
## 28042            beauty          joy
## 28043            beauty     positive
## 28044           cruelty        anger
## 28045           cruelty      disgust
## 28046           cruelty         fear
## 28047           cruelty     negative
## 28048           cruelty      sadness
## 28049            prefer     positive
## 28050            prefer        trust
## 28051            suffer     negative
## 28052            vanity     negative
## 28053            virtue     positive
## 28054            virtue        trust
## 28055             toxic      disgust
## 28056             toxic     negative
## 28057            reason     positive
## 28058     revolutionary     positive
## 28059            biased     negative
## 28060               top anticipation
## 28061               top     positive
## 28062               top        trust
## 28063         ludicrous     negative
## 28064            policy        trust
## 28065         hilarious          joy
## 28066         hilarious     positive
## 28067         hilarious     surprise
## 28068           cruelty        anger
## 28069           cruelty      disgust
## 28070           cruelty         fear
## 28071           cruelty     negative
## 28072           cruelty      sadness
## 28073         hilarious          joy
## 28074         hilarious     positive
## 28075         hilarious     surprise
## 28076              time anticipation
## 28077              time anticipation
## 28078         confident          joy
## 28079         confident     positive
## 28080         confident        trust
## 28081        government         fear
## 28082        government     negative
## 28083             money        anger
## 28084             money anticipation
## 28085             money          joy
## 28086             money     positive
## 28087             money     surprise
## 28088             money        trust
## 28089            happen anticipation
## 28090             cross        anger
## 28091             cross         fear
## 28092             cross     negative
## 28093             cross      sadness
## 28094             major     positive
## 28095        completely     positive
## 28096            liking          joy
## 28097            liking     positive
## 28098            liking        trust
## 28099             start anticipation
## 28100              true          joy
## 28101              true     positive
## 28102              true        trust
## 28103            virtue     positive
## 28104            virtue        trust
## 28105           cruelty        anger
## 28106           cruelty      disgust
## 28107           cruelty         fear
## 28108           cruelty     negative
## 28109           cruelty      sadness
## 28110           knowing     positive
## 28111            gamble     negative
## 28112             witch        anger
## 28113             witch      disgust
## 28114             witch         fear
## 28115             witch     negative
## 28116         enlighten          joy
## 28117         enlighten     positive
## 28118         enlighten        trust
## 28119            friend          joy
## 28120            friend     positive
## 28121            friend        trust
## 28122              love          joy
## 28123              love     positive
## 28124           cruelty        anger
## 28125           cruelty      disgust
## 28126           cruelty         fear
## 28127           cruelty     negative
## 28128           cruelty      sadness
## 28129             happy anticipation
## 28130             happy          joy
## 28131             happy     positive
## 28132             happy        trust
## 28133              hate        anger
## 28134              hate      disgust
## 28135              hate         fear
## 28136              hate     negative
## 28137              hate      sadness
## 28138             awful        anger
## 28139             awful      disgust
## 28140             awful         fear
## 28141             awful     negative
## 28142             awful      sadness
## 28143              hope anticipation
## 28144              hope          joy
## 28145              hope     positive
## 28146              hope     surprise
## 28147              hope        trust
## 28148            happen anticipation
## 28149             sugar     positive
## 28150         difficult         fear
## 28151          practice     positive
## 28152           logical     positive
## 28153         difficult         fear
## 28154           respect anticipation
## 28155           respect          joy
## 28156           respect     positive
## 28157           respect        trust
## 28158           riddled     negative
## 28159          paranoia         fear
## 28160          paranoia     negative
## 28161            secret        trust
## 28162           lurking     negative
## 28163         nefarious      disgust
## 28164         nefarious         fear
## 28165         nefarious     negative
## 28166         nefarious      sadness
## 28167         nefarious     surprise
## 28168           suspect         fear
## 28169           suspect     negative
## 28170            insane        anger
## 28171            insane         fear
## 28172            insane     negative
## 28173            purity     positive
## 28174            purity     surprise
## 28175             found          joy
## 28176             found     positive
## 28177             found        trust
## 28178             leave     negative
## 28179             leave      sadness
## 28180             leave     surprise
## 28181             start anticipation
## 28182        discussion     positive
## 28183       distinction     positive
## 28184           offense        anger
## 28185           offense      disgust
## 28186           offense         fear
## 28187           offense     negative
## 28188           offense      sadness
## 28189               bad        anger
## 28190               bad      disgust
## 28191               bad         fear
## 28192               bad     negative
## 28193               bad      sadness
## 28194             faith anticipation
## 28195             faith          joy
## 28196             faith     positive
## 28197             faith        trust
## 28198           deserve        anger
## 28199           deserve anticipation
## 28200           deserve     positive
## 28201           deserve        trust
## 28202              time anticipation
## 28203       distinction     positive
## 28204           offense        anger
## 28205           offense      disgust
## 28206           offense         fear
## 28207           offense     negative
## 28208           offense      sadness
## 28209               bad        anger
## 28210               bad      disgust
## 28211               bad         fear
## 28212               bad     negative
## 28213               bad      sadness
## 28214             faith anticipation
## 28215             faith          joy
## 28216             faith     positive
## 28217             faith        trust
## 28218               bad        anger
## 28219               bad      disgust
## 28220               bad         fear
## 28221               bad     negative
## 28222               bad      sadness
## 28223             faith anticipation
## 28224             faith          joy
## 28225             faith     positive
## 28226             faith        trust
## 28227       responsible     positive
## 28228       responsible        trust
## 28229        supporting     positive
## 28230        supporting        trust
## 28231        conspiracy         fear
## 28232               bad        anger
## 28233               bad      disgust
## 28234               bad         fear
## 28235               bad     negative
## 28236               bad      sadness
## 28237             faith anticipation
## 28238             faith          joy
## 28239             faith     positive
## 28240             faith        trust
## 28241       immediately anticipation
## 28242       immediately     negative
## 28243       immediately     positive
## 28244            purely     positive
## 28245            purely        trust
## 28246            liking          joy
## 28247            liking     positive
## 28248            liking        trust
## 28249         messenger        trust
## 28250           content          joy
## 28251           content     positive
## 28252           content        trust
## 28253             avoid         fear
## 28254             avoid     negative
## 28255            losing        anger
## 28256            losing     negative
## 28257            losing      sadness
## 28258         arguments        anger
## 28259            losing        anger
## 28260            losing     negative
## 28261            losing      sadness
## 28262          argument        anger
## 28263          argument     negative
## 28264              wear     negative
## 28265              wear        trust
## 28266           improve anticipation
## 28267           improve          joy
## 28268           improve     positive
## 28269           improve        trust
## 28270            virtue     positive
## 28271            virtue        trust
## 28272         encourage          joy
## 28273         encourage     positive
## 28274         encourage        trust
## 28275     consciousness     positive
## 28276            credit     positive
## 28277            credit        trust
## 28278              brag     negative
## 28279          hysteria         fear
## 28280          hysteria     negative
## 28281          isolated         fear
## 28282          isolated     negative
## 28283          isolated      sadness
## 28284      questionable      disgust
## 28285      questionable     negative
## 28286            virtue     positive
## 28287            virtue        trust
## 28288              time anticipation
## 28289           improve anticipation
## 28290           improve          joy
## 28291           improve     positive
## 28292           improve        trust
## 28293          paranoia         fear
## 28294          paranoia     negative
## 28295            change         fear
## 28296            coming anticipation
## 28297            defend         fear
## 28298            defend     positive
## 28299           sincere     positive
## 28300           sincere        trust
## 28301             crazy        anger
## 28302             crazy         fear
## 28303             crazy     negative
## 28304             crazy      sadness
## 28305        surprising     surprise
## 28306           condone     positive
## 28307        surprising     surprise
## 28308         statement     positive
## 28309         statement        trust
## 28310          surprise         fear
## 28311          surprise          joy
## 28312          surprise     positive
## 28313          surprise     surprise
## 28314          argument        anger
## 28315          argument     negative
## 28316          politics        anger
## 28317              cool     positive
## 28318              pick     positive
## 28319              wear     negative
## 28320              wear        trust
## 28321            change         fear
## 28322         convinced        trust
## 28323      questionable      disgust
## 28324      questionable     negative
## 28325            expect anticipation
## 28326            expect     positive
## 28327            expect     surprise
## 28328            expect        trust
## 28329           helpful          joy
## 28330           helpful     positive
## 28331           helpful        trust
## 28332              blue      sadness
## 28333           feature     positive
## 28334          familiar     positive
## 28335          familiar        trust
## 28336          familiar     positive
## 28337          familiar        trust
## 28338        convincing        trust
## 28339            friend          joy
## 28340            friend     positive
## 28341            friend        trust
## 28342           fanatic     negative
## 28343              true          joy
## 28344              true     positive
## 28345              true        trust
## 28346          accurate     positive
## 28347          accurate        trust
## 28348            actual     positive
## 28349           genuine     positive
## 28350           genuine        trust
## 28351          question     positive
## 28352             smell        anger
## 28353             smell      disgust
## 28354             smell     negative
## 28355        technology     positive
## 28356             smell        anger
## 28357             smell      disgust
## 28358             smell     negative
## 28359             angry        anger
## 28360             angry      disgust
## 28361             angry     negative
## 28362             anger        anger
## 28363             anger     negative
## 28364            offend        anger
## 28365            offend      disgust
## 28366            offend     negative
## 28367            system        trust
## 28368              vote        anger
## 28369              vote anticipation
## 28370              vote          joy
## 28371              vote     negative
## 28372              vote     positive
## 28373              vote      sadness
## 28374              vote     surprise
## 28375              vote        trust
## 28376              main     positive
## 28377             idiot      disgust
## 28378             idiot     negative
## 28379             words        anger
## 28380             words     negative
## 28381           feature     positive
## 28382        technology     positive
## 28383        technology     positive
## 28384         olfactory anticipation
## 28385         olfactory     negative
## 28386        technology     positive
## 28387           educate     positive
## 28388              time anticipation
## 28389              talk     positive
## 28390             idiot      disgust
## 28391             idiot     negative
## 28392             cross        anger
## 28393             cross         fear
## 28394             cross     negative
## 28395             cross      sadness
## 28396              true          joy
## 28397              true     positive
## 28398              true        trust
## 28399           feature     positive
## 28400            pretty anticipation
## 28401            pretty          joy
## 28402            pretty     positive
## 28403            pretty        trust
## 28404          accurate     positive
## 28405          accurate        trust
## 28406            submit anticipation
## 28407            pretty anticipation
## 28408            pretty          joy
## 28409            pretty     positive
## 28410            pretty        trust
## 28411              time anticipation
## 28412            submit anticipation
## 28413              hope anticipation
## 28414              hope          joy
## 28415              hope     positive
## 28416              hope     surprise
## 28417              hope        trust
## 28418               top anticipation
## 28419               top     positive
## 28420               top        trust
## 28421              vote        anger
## 28422              vote anticipation
## 28423              vote          joy
## 28424              vote     negative
## 28425              vote     positive
## 28426              vote      sadness
## 28427              vote     surprise
## 28428              vote        trust
## 28429             smell        anger
## 28430             smell      disgust
## 28431             smell     negative
## 28432              vote        anger
## 28433              vote anticipation
## 28434              vote          joy
## 28435              vote     negative
## 28436              vote     positive
## 28437              vote      sadness
## 28438              vote     surprise
## 28439              vote        trust
## 28440               top anticipation
## 28441               top     positive
## 28442               top        trust
## 28443               top anticipation
## 28444               top     positive
## 28445               top        trust
## 28446              hell        anger
## 28447              hell      disgust
## 28448              hell         fear
## 28449              hell     negative
## 28450              hell      sadness
## 28451            mobile anticipation
## 28452              bias        anger
## 28453              bias     negative
## 28454          constant     positive
## 28455          constant        trust
## 28456              cool     positive
## 28457          designer     positive
## 28458          designer     positive
## 28459              smug     negative
## 28460             leave     negative
## 28461             leave      sadness
## 28462             leave     surprise
## 28463           tobacco     negative
## 28464             found          joy
## 28465             found     positive
## 28466             found        trust
## 28467           tobacco     negative
## 28468            floral     positive
## 28469           tobacco     negative
## 28470          tolerate        anger
## 28471          tolerate     negative
## 28472          tolerate      sadness
## 28473              smug     negative
## 28474       responsible     positive
## 28475       responsible        trust
## 28476              true          joy
## 28477              true     positive
## 28478              true        trust
## 28479            pretty anticipation
## 28480            pretty          joy
## 28481            pretty     positive
## 28482            pretty        trust
## 28483              smug     negative
## 28484            pretty anticipation
## 28485            pretty          joy
## 28486            pretty     positive
## 28487            pretty        trust
## 28488              hate        anger
## 28489              hate      disgust
## 28490              hate         fear
## 28491              hate     negative
## 28492              hate      sadness
## 28493        completely     positive
## 28494             focus     positive
## 28495             broke         fear
## 28496             broke     negative
## 28497             broke      sadness
## 28498              time anticipation
## 28499              time anticipation
## 28500          friendly anticipation
## 28501          friendly          joy
## 28502          friendly     positive
## 28503          friendly        trust
## 28504             share anticipation
## 28505             share          joy
## 28506             share     positive
## 28507             share        trust
## 28508              time anticipation
## 28509          standing     positive
## 28510           edition anticipation
## 28511               pop     negative
## 28512               pop     surprise
## 28513        constantly        trust
## 28514           edition anticipation
## 28515              wear     negative
## 28516              wear        trust
## 28517        constantly        trust
## 28518           account        trust
## 28519        completely     positive
## 28520             grant anticipation
## 28521             grant          joy
## 28522             grant     positive
## 28523             grant        trust
## 28524             money        anger
## 28525             money anticipation
## 28526             money          joy
## 28527             money     positive
## 28528             money     surprise
## 28529             money        trust
## 28530            forced         fear
## 28531            forced     negative
## 28532              team        trust
## 28533             trade        trust
## 28534            ruined        anger
## 28535            ruined      disgust
## 28536            ruined         fear
## 28537            ruined     negative
## 28538            ruined      sadness
## 28539             chaos        anger
## 28540             chaos         fear
## 28541             chaos     negative
## 28542             chaos      sadness
## 28543            apathy     negative
## 28544            apathy      sadness
## 28545             money        anger
## 28546             money anticipation
## 28547             money          joy
## 28548             money     positive
## 28549             money     surprise
## 28550             money        trust
## 28551             build     positive
## 28552         organized     positive
## 28553           limited        anger
## 28554           limited     negative
## 28555           limited      sadness
## 28556           edition anticipation
## 28557         difficult         fear
## 28558              lion         fear
## 28559              lion     positive
## 28560             split     negative
## 28561             haven     positive
## 28562             haven        trust
## 28563            pretty anticipation
## 28564            pretty          joy
## 28565            pretty     positive
## 28566            pretty        trust
## 28567            rating        anger
## 28568            rating         fear
## 28569            rating     negative
## 28570            rating      sadness
## 28571         longevity     positive
## 28572            rating        anger
## 28573            rating         fear
## 28574            rating     negative
## 28575            rating      sadness
## 28576            prefer     positive
## 28577            prefer        trust
## 28578              word     positive
## 28579              word        trust
## 28580         breakdown     negative
## 28581             chart        trust
## 28582            joined     positive
## 28583            prefer     positive
## 28584            prefer        trust
## 28585             count     positive
## 28586             count        trust
## 28587         neglected        anger
## 28588         neglected      disgust
## 28589         neglected     negative
## 28590         neglected      sadness
## 28591            change         fear
## 28592          improved     positive
## 28593            boring     negative
## 28594           feature     positive
## 28595              worn     negative
## 28596              worn      sadness
## 28597           useless     negative
## 28598             wrong     negative
## 28599              worn     negative
## 28600              worn      sadness
## 28601              lack     negative
## 28602            afraid         fear
## 28603            afraid     negative
## 28604             wrong     negative
## 28605           account        trust
## 28606           suspect         fear
## 28607           suspect     negative
## 28608               bug      disgust
## 28609               bug         fear
## 28610               bug     negative
## 28611          approval     positive
## 28612            mobile anticipation
## 28613          classify     positive
## 28614           suggest        trust
## 28615           suggest        trust
## 28616        frustrated        anger
## 28617        frustrated     negative
## 28618         organized     positive
## 28619           account        trust
## 28620           account        trust
## 28621             start anticipation
## 28622            poorly     negative
## 28623         organized     positive
## 28624         difficult         fear
## 28625              save          joy
## 28626              save     positive
## 28627              save        trust
## 28628           useless     negative
## 28629            actual     positive
## 28630              main     positive
## 28631             vouch     positive
## 28632             vouch        trust
## 28633         redundant     negative
## 28634            appeal anticipation
## 28635             score anticipation
## 28636             score          joy
## 28637             score     positive
## 28638             score     surprise
## 28639             score anticipation
## 28640             score          joy
## 28641             score     positive
## 28642             score     surprise
## 28643            bother     negative
## 28644           helpful          joy
## 28645           helpful     positive
## 28646           helpful        trust
## 28647          official        trust
## 28648            honest        anger
## 28649            honest      disgust
## 28650            honest         fear
## 28651            honest          joy
## 28652            honest     positive
## 28653            honest      sadness
## 28654            honest        trust
## 28655            regret     negative
## 28656            regret      sadness
## 28657            agreed     positive
## 28658            agreed        trust
## 28659            mobile anticipation
## 28660        thoughtful     positive
## 28661        thoughtful        trust
## 28662               don     positive
## 28663               don        trust
## 28664             leave     negative
## 28665             leave      sadness
## 28666             leave     surprise
## 28667            joined     positive
## 28668             found          joy
## 28669             found     positive
## 28670             found        trust
## 28671           reading     positive
## 28672               pop     negative
## 28673               pop     surprise
## 28674          incident     surprise
## 28675             pride          joy
## 28676             pride     positive
## 28677        depressing      disgust
## 28678        depressing     negative
## 28679        depressing      sadness
## 28680              slur        anger
## 28681              slur      disgust
## 28682              slur     negative
## 28683              slur      sadness
## 28684              fake     negative
## 28685              real     positive
## 28686              real        trust
## 28687           ethical     positive
## 28688           ethical     positive
## 28689         curiosity anticipation
## 28690         curiosity     positive
## 28691         curiosity     surprise
## 28692            insane        anger
## 28693            insane         fear
## 28694            insane     negative
## 28695        unexpected anticipation
## 28696        unexpected         fear
## 28697        unexpected          joy
## 28698        unexpected     negative
## 28699        unexpected     positive
## 28700        unexpected     surprise
## 28701        contribute     positive
## 28702           content          joy
## 28703           content     positive
## 28704           content        trust
## 28705           content          joy
## 28706           content     positive
## 28707           content        trust
## 28708              time anticipation
## 28709          politics        anger
## 28710          politics        anger
## 28711           reserve     positive
## 28712          politics        anger
## 28713        acceptable     positive
## 28714        resolutely     positive
## 28715           pretend     negative
## 28716          politics        anger
## 28717          politics        anger
## 28718         hilarious          joy
## 28719         hilarious     positive
## 28720         hilarious     surprise
## 28721          cleaning     positive
## 28722          friendly anticipation
## 28723          friendly          joy
## 28724          friendly     positive
## 28725          friendly        trust
## 28726            stupid     negative
## 28727             wrong     negative
## 28728          suddenly     surprise
## 28729            excuse     negative
## 28730              time anticipation
## 28731              shit        anger
## 28732              shit      disgust
## 28733              shit     negative
## 28734             pride          joy
## 28735             pride     positive
## 28736            speech     positive
## 28737               don     positive
## 28738               don        trust
## 28739              wise     positive
## 28740          politics        anger
## 28741             visit     positive
## 28742       information     positive
## 28743            change         fear
## 28744              wild     negative
## 28745              wild     surprise
## 28746             watch anticipation
## 28747             watch         fear
## 28748              real     positive
## 28749              real        trust
## 28750              time anticipation
## 28751             guess     surprise
## 28752              wild     negative
## 28753              wild     surprise
## 28754              joke     negative
## 28755               don     positive
## 28756               don        trust
## 28757          disagree        anger
## 28758          disagree     negative
## 28759             spent     negative
## 28760          building     positive
## 28761         hypocrisy     negative
## 28762             awful        anger
## 28763             awful      disgust
## 28764             awful         fear
## 28765             awful     negative
## 28766             awful      sadness
## 28767        foundation     positive
## 28768              plan anticipation
## 28769           savings     positive
## 28770          lowering     negative
## 28771            change         fear
## 28772              kill         fear
## 28773              kill     negative
## 28774              kill      sadness
## 28775         longevity     positive
## 28776              cool     positive
## 28777           denying anticipation
## 28778           denying     negative
## 28779          imminent anticipation
## 28780          imminent         fear
## 28781            threat        anger
## 28782            threat         fear
## 28783            threat     negative
## 28784            change         fear
## 28785            change         fear
## 28786             agree     positive
## 28787             ready anticipation
## 28788              jump          joy
## 28789              jump     positive
## 28790             wrong     negative
## 28791       distraction     negative
## 28792               don     positive
## 28793               don        trust
## 28794            choice     positive
## 28795          question     positive
## 28796            frenzy     negative
## 28797         crouching         fear
## 28798         crouching     negative
## 28799              jump          joy
## 28800              jump     positive
## 28801            cancel     negative
## 28802            cancel      sadness
## 28803         alleviate     positive
## 28804             guilt      disgust
## 28805             guilt     negative
## 28806             guilt      sadness
## 28807           opposed        anger
## 28808           opposed         fear
## 28809           opposed     negative
## 28810             laugh          joy
## 28811             laugh     positive
## 28812             laugh     surprise
## 28813          vehement        anger
## 28814          vehement         fear
## 28815          vehement     negative
## 28816            freely          joy
## 28817            freely     positive
## 28818            freely        trust
## 28819            cancel     negative
## 28820            cancel      sadness
## 28821           culture     positive
## 28822         encourage          joy
## 28823         encourage     positive
## 28824         encourage        trust
## 28825             agree     positive
## 28826            cancel     negative
## 28827            cancel      sadness
## 28828             shame      disgust
## 28829             shame         fear
## 28830             shame     negative
## 28831             shame      sadness
## 28832          suppress        anger
## 28833          suppress         fear
## 28834          suppress     negative
## 28835          suppress      sadness
## 28836           freedom          joy
## 28837           freedom     positive
## 28838           freedom        trust
## 28839       information     positive
## 28840           granted     positive
## 28841             truth     positive
## 28842             truth        trust
## 28843      intelligence         fear
## 28844      intelligence          joy
## 28845      intelligence     positive
## 28846      intelligence        trust
## 28847               mob        anger
## 28848               mob         fear
## 28849               mob     negative
## 28850               mad        anger
## 28851               mad      disgust
## 28852               mad         fear
## 28853               mad     negative
## 28854               mad      sadness
## 28855               don     positive
## 28856               don        trust
## 28857          educated     positive
## 28858        discussion     positive
## 28859            cancel     negative
## 28860            cancel      sadness
## 28861             quiet     positive
## 28862             quiet      sadness
## 28863             green          joy
## 28864             green     positive
## 28865             green        trust
## 28866             devil        anger
## 28867             devil anticipation
## 28868             devil      disgust
## 28869             devil         fear
## 28870             devil     negative
## 28871             devil      sadness
## 28872          advocate        trust
## 28873               don     positive
## 28874               don        trust
## 28875               don     positive
## 28876               don        trust
## 28877               pay anticipation
## 28878               pay          joy
## 28879               pay     positive
## 28880               pay        trust
## 28881         attention     positive
## 28882               don     positive
## 28883               don        trust
## 28884               don     positive
## 28885               don        trust
## 28886             green          joy
## 28887             green     positive
## 28888             green        trust
## 28889          question     positive
## 28890            public anticipation
## 28891            public     positive
## 28892              save          joy
## 28893              save     positive
## 28894              save        trust
## 28895         encourage          joy
## 28896         encourage     positive
## 28897         encourage        trust
## 28898         hypocrisy     negative
## 28899             giant         fear
## 28900          question     positive
## 28901     consciousness     positive
## 28902        irrational      disgust
## 28903        irrational         fear
## 28904        irrational     negative
## 28905              fear        anger
## 28906              fear         fear
## 28907              fear     negative
## 28908          increase     positive
## 28909           reading     positive
## 28910           assault        anger
## 28911           assault         fear
## 28912           assault     negative
## 28913           freedom          joy
## 28914           freedom     positive
## 28915           freedom        trust
## 28916     consciousness     positive
## 28917             mouth     surprise
## 28918       overwhelmed     negative
## 28919       overwhelmed      sadness
## 28920         advantage     positive
## 28921         overwhelm     negative
## 28922              gain anticipation
## 28923              gain          joy
## 28924              gain     positive
## 28925              hate        anger
## 28926              hate      disgust
## 28927              hate         fear
## 28928              hate     negative
## 28929              hate      sadness
## 28930           equally     positive
## 28931          disagree        anger
## 28932          disagree     negative
## 28933           reading     positive
## 28934              ship anticipation
## 28935          horrible        anger
## 28936          horrible      disgust
## 28937          horrible         fear
## 28938          horrible     negative
## 28939              time anticipation
## 28940            inform        trust
## 28941        ultimately anticipation
## 28942        ultimately     positive
## 28943              glad anticipation
## 28944              glad          joy
## 28945              glad     positive
## 28946              glad anticipation
## 28947              glad          joy
## 28948              glad     positive
## 28949             agree     positive
## 28950              time anticipation
## 28951         providing anticipation
## 28952         providing          joy
## 28953         providing     positive
## 28954         providing        trust
## 28955       information     positive
## 28956             clean          joy
## 28957             clean     positive
## 28958             clean        trust
## 28959         absurdity     negative
## 28960           organic     positive
## 28961      friendliness          joy
## 28962      friendliness     positive
## 28963      friendliness        trust
## 28964           cruelty        anger
## 28965           cruelty      disgust
## 28966           cruelty         fear
## 28967           cruelty     negative
## 28968           cruelty      sadness
## 28969           medical anticipation
## 28970           medical         fear
## 28971           medical     positive
## 28972           medical        trust
## 28973      professional     positive
## 28974      professional        trust
## 28975              time anticipation
## 28976            effort     positive
## 28977         providing anticipation
## 28978         providing          joy
## 28979         providing     positive
## 28980         providing        trust
## 28981       information     positive
## 28982         hypocrisy     negative
## 28983             upset        anger
## 28984             upset     negative
## 28985             upset      sadness
## 28986            effort     positive
## 28987            actual     positive
## 28988             words        anger
## 28989             words     negative
## 28990     consciousness     positive
## 28991              bore     negative
## 28992            change         fear
## 28993           anxiety        anger
## 28994           anxiety anticipation
## 28995           anxiety         fear
## 28996           anxiety     negative
## 28997           anxiety      sadness
## 28998            change         fear
## 28999            change         fear
## 29000        responsive anticipation
## 29001        responsive     positive
## 29002        responsive        trust
## 29003           anxiety        anger
## 29004           anxiety anticipation
## 29005           anxiety         fear
## 29006           anxiety     negative
## 29007           anxiety      sadness
## 29008          hysteria         fear
## 29009          hysteria     negative
## 29010             moral        anger
## 29011             moral     positive
## 29012             moral        trust
## 29013     consciousness     positive
## 29014              hope anticipation
## 29015              hope          joy
## 29016              hope     positive
## 29017              hope     surprise
## 29018              hope        trust
## 29019            unfair        anger
## 29020            unfair      disgust
## 29021            unfair     negative
## 29022            unfair      sadness
## 29023               don     positive
## 29024               don        trust
## 29025              clue anticipation
## 29026            actual     positive
## 29027             clean          joy
## 29028             clean     positive
## 29029             clean        trust
## 29030            happen anticipation
## 29031           dislike        anger
## 29032           dislike      disgust
## 29033           dislike     negative
## 29034          kindness     positive
## 29035               don     positive
## 29036               don        trust
## 29037            unfair        anger
## 29038            unfair      disgust
## 29039            unfair     negative
## 29040            unfair      sadness
## 29041               don     positive
## 29042               don        trust
## 29043           culture     positive
## 29044           reading     positive
## 29045           dislike        anger
## 29046           dislike      disgust
## 29047           dislike     negative
## 29048          kindness     positive
## 29049           cruelty        anger
## 29050           cruelty      disgust
## 29051           cruelty         fear
## 29052           cruelty     negative
## 29053           cruelty      sadness
## 29054             labor anticipation
## 29055             labor          joy
## 29056             labor     positive
## 29057             labor     surprise
## 29058             labor        trust
## 29059             green          joy
## 29060             green     positive
## 29061             green        trust
## 29062      manufacturer     positive
## 29063          friendly anticipation
## 29064          friendly          joy
## 29065          friendly     positive
## 29066          friendly        trust
## 29067        protecting     positive
## 29068        protecting        trust
## 29069           ability     positive
## 29070           harmful        anger
## 29071           harmful      disgust
## 29072           harmful         fear
## 29073           harmful     negative
## 29074           harmful      sadness
## 29075               bad        anger
## 29076               bad      disgust
## 29077               bad         fear
## 29078               bad     negative
## 29079               bad      sadness
## 29080            loathe        anger
## 29081            loathe      disgust
## 29082            loathe     negative
## 29083           culture     positive
## 29084           begging     negative
## 29085          disagree        anger
## 29086          disagree     negative
## 29087              glad anticipation
## 29088              glad          joy
## 29089              glad     positive
## 29090            debate     positive
## 29091            defend         fear
## 29092            defend     positive
## 29093          offended        anger
## 29094          offended     negative
## 29095          offended      sadness
## 29096              holy     positive
## 29097              vote        anger
## 29098              vote anticipation
## 29099              vote          joy
## 29100              vote     negative
## 29101              vote     positive
## 29102              vote      sadness
## 29103              vote     surprise
## 29104              vote        trust
## 29105           heavily     negative
## 29106          politics        anger
## 29107        unexpected anticipation
## 29108        unexpected         fear
## 29109        unexpected          joy
## 29110        unexpected     negative
## 29111        unexpected     positive
## 29112        unexpected     surprise
## 29113            coming anticipation
## 29114              hate        anger
## 29115              hate      disgust
## 29116              hate         fear
## 29117              hate     negative
## 29118              hate      sadness
## 29119            speech     positive
## 29120            speech     positive
## 29121              fair     positive
## 29122              time anticipation
## 29123           finally anticipation
## 29124           finally      disgust
## 29125           finally          joy
## 29126           finally     positive
## 29127           finally     surprise
## 29128           finally        trust
## 29129           account        trust
## 29130          disagree        anger
## 29131          disagree     negative
## 29132           protect     positive
## 29133       immediately anticipation
## 29134       immediately     negative
## 29135       immediately     positive
## 29136          official        trust
## 29137           outrage        anger
## 29138           outrage      disgust
## 29139           outrage     negative
## 29140           footing        trust
## 29141            change         fear
## 29142            denial     negative
## 29143            absurd     negative
## 29144        production anticipation
## 29145        production     positive
## 29146           deserve        anger
## 29147           deserve anticipation
## 29148           deserve     positive
## 29149           deserve        trust
## 29150            credit     positive
## 29151            credit        trust
## 29152     consciousness     positive
## 29153          gullible     negative
## 29154          gullible      sadness
## 29155          gullible        trust
## 29156          strongly     positive
## 29157            change         fear
## 29158            crisis     negative
## 29159              hoax        anger
## 29160              hoax      disgust
## 29161              hoax     negative
## 29162              hoax      sadness
## 29163              hoax     surprise
## 29164             weird      disgust
## 29165             weird     negative
## 29166           perfect anticipation
## 29167           perfect          joy
## 29168           perfect     positive
## 29169           perfect        trust
## 29170           include     positive
## 29171     consciousness     positive
## 29172         influence     negative
## 29173         influence     positive
## 29174            demand        anger
## 29175            demand     negative
## 29176            demand        anger
## 29177            demand     negative
## 29178            supply     positive
## 29179             force        anger
## 29180             force         fear
## 29181             force     negative
## 29182             bully        anger
## 29183             bully         fear
## 29184             bully     negative
## 29185          weakness     negative
## 29186         desperate     negative
## 29187              gasp     surprise
## 29188             agree     positive
## 29189        production anticipation
## 29190        production     positive
## 29191           bloated      disgust
## 29192           bloated     negative
## 29193           account        trust
## 29194              mail anticipation
## 29195          personal        trust
## 29196             idiot      disgust
## 29197             idiot     negative
## 29198             sadly     negative
## 29199             sadly      sadness
## 29200         surprised     surprise
## 29201             sense     positive
## 29202              dumb     negative
## 29203              love          joy
## 29204              love     positive
## 29205              fair     positive
## 29206              buzz anticipation
## 29207              buzz         fear
## 29208              buzz     positive
## 29209             words        anger
## 29210             words     negative
## 29211           corrupt     negative
## 29212        impossible     negative
## 29213        impossible      sadness
## 29214            virtue     positive
## 29215            virtue        trust
## 29216            reason     positive
## 29217            reason     positive
## 29218           perfect anticipation
## 29219           perfect          joy
## 29220           perfect     positive
## 29221           perfect        trust
## 29222         scapegoat        anger
## 29223         scapegoat         fear
## 29224         scapegoat     negative
## 29225              ruin         fear
## 29226              ruin     negative
## 29227              ruin      sadness
## 29228           ethical     positive
## 29229              fake     negative
## 29230              buzz anticipation
## 29231              buzz         fear
## 29232              buzz     positive
## 29233             words        anger
## 29234             words     negative
## 29235          annoying        anger
## 29236          annoying     negative
## 29237              crap      disgust
## 29238              crap     negative
## 29239           cruelty        anger
## 29240           cruelty      disgust
## 29241           cruelty         fear
## 29242           cruelty     negative
## 29243           cruelty      sadness
## 29244       information     positive
## 29245          politics        anger
## 29246            change         fear
## 29247           limited        anger
## 29248           limited     negative
## 29249           limited      sadness
## 29250           edition anticipation
## 29251              ship anticipation
## 29252             store anticipation
## 29253             store     positive
## 29254          friendly anticipation
## 29255          friendly          joy
## 29256          friendly     positive
## 29257          friendly        trust
## 29258            joined     positive
## 29259          incident     surprise
## 29260            credit     positive
## 29261            credit        trust
## 29262         hypocrisy     negative
## 29263          politics        anger
## 29264     controversial        anger
## 29265     controversial     negative
## 29266             agree     positive
## 29267        completely     positive
## 29268              love          joy
## 29269              love     positive
## 29270              true          joy
## 29271              true     positive
## 29272              true        trust
## 29273          educated     positive
## 29274           subject     negative
## 29275          accurate     positive
## 29276          accurate        trust
## 29277              real     positive
## 29278              real        trust
## 29279         suspicion         fear
## 29280         suspicion     negative
## 29281           rightly     positive
## 29282             money        anger
## 29283             money anticipation
## 29284             money          joy
## 29285             money     positive
## 29286             money     surprise
## 29287             money        trust
## 29288            ruined        anger
## 29289            ruined      disgust
## 29290            ruined         fear
## 29291            ruined     negative
## 29292            ruined      sadness
## 29293            ground        trust
## 29294          ulterior     negative
## 29295            motive     positive
## 29296             worth     positive
## 29297            writer     positive
## 29298               don     positive
## 29299               don        trust
## 29300           reading     positive
## 29301         wonderful          joy
## 29302         wonderful     positive
## 29303         wonderful     surprise
## 29304         wonderful        trust
## 29305             hobby          joy
## 29306             hobby     positive
## 29307              shit        anger
## 29308              shit      disgust
## 29309              shit     negative
## 29310              rest     positive
## 29311            refuse     negative
## 29312        contribute     positive
## 29313            option     positive
## 29314            prefer     positive
## 29315            prefer        trust
## 29316             sweet anticipation
## 29317             sweet          joy
## 29318             sweet     positive
## 29319             sweet     surprise
## 29320             sweet        trust
## 29321               bye anticipation
## 29322        acceptable     positive
## 29323         surprised     surprise
## 29324              base        trust
## 29325             tired     negative
## 29326        contribute     positive
## 29327            change         fear
## 29328           helpful          joy
## 29329           helpful     positive
## 29330           helpful        trust
## 29331              glad anticipation
## 29332              glad          joy
## 29333              glad     positive
## 29334             start anticipation
## 29335            income anticipation
## 29336            income          joy
## 29337            income     negative
## 29338            income     positive
## 29339            income      sadness
## 29340            income        trust
## 29341           contact     positive
## 29342        affiliated     positive
## 29343             found          joy
## 29344             found     positive
## 29345             found        trust
## 29346           contact     positive
## 29347           scholar     positive
## 29348             share anticipation
## 29349             share          joy
## 29350             share     positive
## 29351             share        trust
## 29352            mobile anticipation
## 29353           contact     positive
## 29354        affiliated     positive
## 29355              john      disgust
## 29356              john     negative
## 29357              time anticipation
## 29358        disgusting        anger
## 29359        disgusting      disgust
## 29360        disgusting         fear
## 29361        disgusting     negative
## 29362          pathetic      disgust
## 29363          pathetic     negative
## 29364          pathetic      sadness
## 29365              time anticipation
## 29366               god anticipation
## 29367               god         fear
## 29368               god          joy
## 29369               god     positive
## 29370               god        trust
## 29371             moral        anger
## 29372             moral     positive
## 29373             moral        trust
## 29374            denial     negative
## 29375           bravery     positive
## 29376            pretty anticipation
## 29377            pretty          joy
## 29378            pretty     positive
## 29379            pretty        trust
## 29380              true          joy
## 29381              true     positive
## 29382              true        trust
## 29383        scientific     positive
## 29384        scientific        trust
## 29385         scientist anticipation
## 29386         scientist     positive
## 29387         scientist        trust
## 29388             avoid         fear
## 29389             avoid     negative
## 29390               don     positive
## 29391               don        trust
## 29392             merit     positive
## 29393             merit        trust
## 29394         criticism        anger
## 29395         criticism     negative
## 29396         criticism      sadness
## 29397              talk     positive
## 29398              talk     positive
## 29399              harm         fear
## 29400              harm     negative
## 29401            change         fear
## 29402            crisis     negative
## 29403              hoax        anger
## 29404              hoax      disgust
## 29405              hoax     negative
## 29406              hoax      sadness
## 29407              hoax     surprise
## 29408           deserve        anger
## 29409           deserve anticipation
## 29410           deserve     positive
## 29411           deserve        trust
## 29412             faith anticipation
## 29413             faith          joy
## 29414             faith     positive
## 29415             faith        trust
## 29416           asshole        anger
## 29417           asshole      disgust
## 29418           asshole     negative
## 29419       intelligent     positive
## 29420       intelligent        trust
## 29421         disregard     negative
## 29422              crap      disgust
## 29423              crap     negative
## 29424               don     positive
## 29425               don        trust
## 29426          morality     positive
## 29427          morality        trust
## 29428              cult         fear
## 29429              cult     negative
## 29430          contrary     negative
## 29431              lack     negative
## 29432          contrary     negative
## 29433             wrong     negative
## 29434            choice     positive
## 29435            choice     positive
## 29436            police         fear
## 29437            police     positive
## 29438            police        trust
## 29439               don     positive
## 29440               don        trust
## 29441          politics        anger
## 29442              love          joy
## 29443              love     positive
## 29444              time anticipation
## 29445             upset        anger
## 29446             upset     negative
## 29447             upset      sadness
## 29448              kill         fear
## 29449              kill     negative
## 29450              kill      sadness
## 29451        government         fear
## 29452        government     negative
## 29453          absolute     positive
## 29454          pandemic         fear
## 29455          pandemic     negative
## 29456          pandemic      sadness
## 29457            create          joy
## 29458            create     positive
## 29459            choice     positive
## 29460              dark      sadness
## 29461              crap      disgust
## 29462              crap     negative
## 29463            forget     negative
## 29464          question     positive
## 29465               don     positive
## 29466               don        trust
## 29467             agree     positive
## 29468        domination        anger
## 29469        domination         fear
## 29470        domination     negative
## 29471        domination      sadness
## 29472              talk     positive
## 29473             leave     negative
## 29474             leave      sadness
## 29475             leave     surprise
## 29476              love          joy
## 29477              love     positive
## 29478              cult         fear
## 29479              cult     negative
## 29480          morality     positive
## 29481          morality        trust
## 29482          disagree        anger
## 29483          disagree     negative
## 29484               bad        anger
## 29485               bad      disgust
## 29486               bad         fear
## 29487               bad     negative
## 29488               bad      sadness
## 29489               bad        anger
## 29490               bad      disgust
## 29491               bad         fear
## 29492               bad     negative
## 29493               bad      sadness
## 29494             shame      disgust
## 29495             shame         fear
## 29496             shame     negative
## 29497             shame      sadness
## 29498            change         fear
## 29499              hoax        anger
## 29500              hoax      disgust
## 29501              hoax     negative
## 29502              hoax      sadness
## 29503              hoax     surprise
## 29504              gain anticipation
## 29505              gain          joy
## 29506              gain     positive
## 29507        disgusting        anger
## 29508        disgusting      disgust
## 29509        disgusting         fear
## 29510        disgusting     negative
## 29511           immoral        anger
## 29512           immoral      disgust
## 29513           immoral         fear
## 29514           immoral     negative
## 29515           immoral      sadness
## 29516            battle        anger
## 29517            battle     negative
## 29518            change         fear
## 29519        population     positive
## 29520            virtue     positive
## 29521            virtue        trust
## 29522         explosive        anger
## 29523         explosive anticipation
## 29524         explosive         fear
## 29525         explosive     negative
## 29526         explosive     surprise
## 29527        population     positive
## 29528            growth     positive
## 29529              grow anticipation
## 29530              grow          joy
## 29531              grow     positive
## 29532              grow        trust
## 29533              base        trust
## 29534             cheap     negative
## 29535        production anticipation
## 29536        production     positive
## 29537               don     positive
## 29538               don        trust
## 29539           rightly     positive
## 29540             idiot      disgust
## 29541             idiot     negative
## 29542              dumb     negative
## 29543              shit        anger
## 29544              shit      disgust
## 29545              shit     negative
## 29546            option     positive
## 29547            broken        anger
## 29548            broken         fear
## 29549            broken     negative
## 29550            broken      sadness
## 29551            debate     positive
## 29552            denial     negative
## 29553        pretending        anger
## 29554        pretending     negative
## 29555              main     positive
## 29556          pandemic         fear
## 29557          pandemic     negative
## 29558          pandemic      sadness
## 29559         confirmed     positive
## 29560         confirmed        trust
## 29561          ignorant      disgust
## 29562          ignorant     negative
## 29563           boycott     negative
## 29564             agree     positive
## 29565          personal        trust
## 29566            expect anticipation
## 29567            expect     positive
## 29568            expect     surprise
## 29569            expect        trust
## 29570           diverse     negative
## 29571           diverse     positive
## 29572              base        trust
## 29573             toxic      disgust
## 29574             toxic     negative
## 29575            actual     positive
## 29576            create          joy
## 29577            create     positive
## 29578             waste      disgust
## 29579             waste     negative
## 29580        government         fear
## 29581        government     negative
## 29582            policy        trust
## 29583            actual     positive
## 29584             worth     positive
## 29585           harmful        anger
## 29586           harmful      disgust
## 29587           harmful         fear
## 29588           harmful     negative
## 29589           harmful      sadness
## 29590           harmful        anger
## 29591           harmful      disgust
## 29592           harmful         fear
## 29593           harmful     negative
## 29594           harmful      sadness
## 29595          practice     positive
## 29596            denial     negative
## 29597              deal anticipation
## 29598              deal          joy
## 29599              deal     positive
## 29600              deal     surprise
## 29601              deal        trust
## 29602            change         fear
## 29603           denying anticipation
## 29604           denying     negative
## 29605             worse         fear
## 29606             worse     negative
## 29607             worse      sadness
## 29608              time anticipation
## 29609              true          joy
## 29610              true     positive
## 29611              true        trust
## 29612            friend          joy
## 29613            friend     positive
## 29614            friend        trust
## 29615               god anticipation
## 29616               god         fear
## 29617               god          joy
## 29618               god     positive
## 29619               god        trust
## 29620            horror        anger
## 29621            horror      disgust
## 29622            horror         fear
## 29623            horror     negative
## 29624            horror      sadness
## 29625            horror     surprise
## 29626          politics        anger
## 29627             agree     positive
## 29628             gross      disgust
## 29629             gross     negative
## 29630           account        trust
## 29631          politics        anger
## 29632             worse         fear
## 29633             worse     negative
## 29634             worse      sadness
## 29635          audience anticipation
## 29636            oppose     negative
## 29637              fire         fear
## 29638           related        trust
## 29639               don     positive
## 29640               don        trust
## 29641             agree     positive
## 29642             learn     positive
## 29643              calm     positive
## 29644         attention     positive
## 29645         criticize        anger
## 29646         criticize      disgust
## 29647         criticize         fear
## 29648         criticize     negative
## 29649         criticize      sadness
## 29650              calm     positive
## 29651              calm     positive
## 29652             guess     surprise
## 29653           denying anticipation
## 29654           denying     negative
## 29655            change         fear
## 29656             green          joy
## 29657             green     positive
## 29658             green        trust
## 29659         substance     positive
## 29660             fault     negative
## 29661             fault      sadness
## 29662         criticism        anger
## 29663         criticism     negative
## 29664         criticism      sadness
## 29665             devil        anger
## 29666             devil anticipation
## 29667             devil      disgust
## 29668             devil         fear
## 29669             devil     negative
## 29670             devil      sadness
## 29671            trendy     positive
## 29672        misleading        anger
## 29673        misleading      disgust
## 29674        misleading     negative
## 29675       meaningless     negative
## 29676       meaningless      sadness
## 29677              rest     positive
## 29678            change         fear
## 29679            change         fear
## 29680               hot        anger
## 29681              fall     negative
## 29682              fall      sadness
## 29683              rage        anger
## 29684              rage     negative
## 29685              bait         fear
## 29686              bait     negative
## 29687              bait        trust
## 29688               mob        anger
## 29689               mob         fear
## 29690               mob     negative
## 29691           classic     positive
## 29692              join     positive
## 29693              jerk        anger
## 29694              jerk     surprise
## 29695           account        trust
## 29696              shit        anger
## 29697              shit      disgust
## 29698              shit     negative
## 29699             guess     surprise
## 29700             store anticipation
## 29701             store     positive
## 29702             fixed        trust
## 29703              quit     negative
## 29704             blame        anger
## 29705             blame      disgust
## 29706             blame     negative
## 29707             blame        anger
## 29708             blame      disgust
## 29709             blame     negative
## 29710             blame        anger
## 29711             blame      disgust
## 29712             blame     negative
## 29713              evil        anger
## 29714              evil      disgust
## 29715              evil         fear
## 29716              evil     negative
## 29717              evil      sadness
## 29718        disgusting        anger
## 29719        disgusting      disgust
## 29720        disgusting         fear
## 29721        disgusting     negative
## 29722            losing        anger
## 29723            losing     negative
## 29724            losing      sadness
## 29725             blame        anger
## 29726             blame      disgust
## 29727             blame     negative
## 29728              save          joy
## 29729              save     positive
## 29730              save        trust
## 29731      disingenuous      disgust
## 29732      disingenuous     negative
## 29733            victim        anger
## 29734            victim         fear
## 29735            victim     negative
## 29736            victim      sadness
## 29737            victim        anger
## 29738            victim         fear
## 29739            victim     negative
## 29740            victim      sadness
## 29741             wrong     negative
## 29742            coming anticipation
## 29743         attacking        anger
## 29744         attacking      disgust
## 29745         attacking         fear
## 29746         attacking     negative
## 29747         attacking      sadness
## 29748         attacking     surprise
## 29749           chicken         fear
## 29750         terrorist        anger
## 29751         terrorist      disgust
## 29752         terrorist         fear
## 29753         terrorist     negative
## 29754         terrorist      sadness
## 29755         terrorist     surprise
## 29756         righteous     positive
## 29757             agree     positive
## 29758               don     positive
## 29759               don        trust
## 29760          official        trust
## 29761             guess     surprise
## 29762               job     positive
## 29763           account        trust
## 29764             found          joy
## 29765             found     positive
## 29766             found        trust
## 29767         difficult         fear
## 29768           contact     positive
## 29769               god anticipation
## 29770               god         fear
## 29771               god          joy
## 29772               god     positive
## 29773               god        trust
## 29774             upset        anger
## 29775             upset     negative
## 29776             upset      sadness
## 29777             wrong     negative
## 29778           culture     positive
## 29779             wrong     negative
## 29780       communicate     positive
## 29781       communicate        trust
## 29782        immaturity        anger
## 29783        immaturity anticipation
## 29784        immaturity     negative
## 29785        insecurity         fear
## 29786        insecurity     negative
## 29787          gullible     negative
## 29788          gullible      sadness
## 29789          gullible        trust
## 29790             birth anticipation
## 29791             birth         fear
## 29792             birth          joy
## 29793             birth     positive
## 29794             birth        trust
## 29795         communist     negative
## 29796               bad        anger
## 29797               bad      disgust
## 29798               bad         fear
## 29799               bad     negative
## 29800               bad      sadness
## 29801               bad        anger
## 29802               bad      disgust
## 29803               bad         fear
## 29804               bad     negative
## 29805               bad      sadness
## 29806          official        trust
## 29807              king     positive
## 29808              blue      sadness
## 29809              king     positive
## 29810              blue      sadness
## 29811              king     positive
## 29812              blue      sadness
## 29813               gun        anger
## 29814               gun         fear
## 29815               gun     negative
## 29816          violence        anger
## 29817          violence         fear
## 29818          violence     negative
## 29819          violence      sadness
## 29820             money        anger
## 29821             money anticipation
## 29822             money          joy
## 29823             money     positive
## 29824             money     surprise
## 29825             money        trust
## 29826            growth     positive
## 29827             proof        trust
## 29828               job     positive
## 29829        completely     positive
## 29830              time anticipation
## 29831               don     positive
## 29832               don        trust
## 29833         obscurity     negative
## 29834         forgotten         fear
## 29835         forgotten     negative
## 29836         forgotten      sadness
## 29837               don     positive
## 29838               don        trust
## 29839           granted     positive
## 29840              real     positive
## 29841              real        trust
## 29842            change         fear
## 29843         pointless     negative
## 29844         pointless      sadness
## 29845             waste      disgust
## 29846             waste     negative
## 29847          customer     positive
## 29848            expect anticipation
## 29849            expect     positive
## 29850            expect     surprise
## 29851            expect        trust
## 29852       information     positive
## 29853           refugee      sadness
## 29854             weird      disgust
## 29855             weird     negative
## 29856               die         fear
## 29857               die     negative
## 29858               die      sadness
## 29859             cider     positive
## 29860          gigantic     positive
## 29861              joke     negative
## 29862           worship anticipation
## 29863           worship         fear
## 29864           worship          joy
## 29865           worship     positive
## 29866           worship        trust
## 29867        government         fear
## 29868        government     negative
## 29869            policy        trust
## 29870         practiced          joy
## 29871         practiced     positive
## 29872         practiced     surprise
## 29873         practiced        trust
## 29874            nation        trust
## 29875            forget     negative
## 29876        population     positive
## 29877        population     positive
## 29878        population     positive
## 29879        population     positive
## 29880             money        anger
## 29881             money anticipation
## 29882             money          joy
## 29883             money     positive
## 29884             money     surprise
## 29885             money        trust
## 29886       exaggerated     negative
## 29887        propaganda     negative
## 29888           garbage      disgust
## 29889           garbage     negative
## 29890             dying        anger
## 29891             dying      disgust
## 29892             dying         fear
## 29893             dying     negative
## 29894             dying      sadness
## 29895           worship anticipation
## 29896           worship         fear
## 29897           worship          joy
## 29898           worship     positive
## 29899           worship        trust
## 29900          friendly anticipation
## 29901          friendly          joy
## 29902          friendly     positive
## 29903          friendly        trust
## 29904            excuse     negative
## 29905             lynch        anger
## 29906             lynch      disgust
## 29907             lynch         fear
## 29908             lynch     negative
## 29909             lynch      sadness
## 29910              gold     positive
## 29911        government         fear
## 29912        government     negative
## 29913            punish         fear
## 29914            punish     negative
## 29915            flying         fear
## 29916            flying     positive
## 29917               fun anticipation
## 29918               fun          joy
## 29919               fun     positive
## 29920        production anticipation
## 29921        production     positive
## 29922             worse         fear
## 29923             worse     negative
## 29924             worse      sadness
## 29925              wait anticipation
## 29926              wait     negative
## 29927               fun anticipation
## 29928               fun          joy
## 29929               fun     positive
## 29930           useless     negative
## 29931             waste      disgust
## 29932             waste     negative
## 29933          solution     positive
## 29934             proof        trust
## 29935          momentum anticipation
## 29936          momentum     positive
## 29937             cheap     negative
## 29938            policy        trust
## 29939              time anticipation
## 29940            stable     positive
## 29941            stable        trust
## 29942         resources          joy
## 29943         resources     positive
## 29944         resources        trust
## 29945         resources          joy
## 29946         resources     positive
## 29947         resources        trust
## 29948         resources          joy
## 29949         resources     positive
## 29950         resources        trust
## 29951          included     positive
## 29952           include     positive
## 29953         producing     positive
## 29954            demand        anger
## 29955            demand     negative
## 29956            wasted        anger
## 29957            wasted      disgust
## 29958            wasted     negative
## 29959             focus     positive
## 29960         efficient anticipation
## 29961         efficient     positive
## 29962         efficient        trust
## 29963               sky     positive
## 29964               sun anticipation
## 29965               sun          joy
## 29966               sun     positive
## 29967               sun     surprise
## 29968               sun        trust
## 29969         guarantee     positive
## 29970         guarantee        trust
## 29971            excess     negative
## 29972            effort     positive
## 29973         efficient anticipation
## 29974         efficient     positive
## 29975         efficient        trust
## 29976             agree     positive
## 29977              base        trust
## 29978      overwhelming     positive
## 29979              fear        anger
## 29980              fear         fear
## 29981              fear     negative
## 29982          endeavor anticipation
## 29983          endeavor     positive
## 29984            timely     positive
## 29985          improved     positive
## 29986        efficiency     positive
## 29987             green          joy
## 29988             green     positive
## 29989             green        trust
## 29990          fighting        anger
## 29991          fighting     negative
## 29992           limited        anger
## 29993           limited     negative
## 29994           limited      sadness
## 29995         resources          joy
## 29996         resources     positive
## 29997         resources        trust
## 29998            change         fear
## 29999             razor         fear
## 30000          solution     positive
## 30001            crisis     negative
## 30002             giant         fear
## 30003               sky     positive
## 30004             focus     positive
## 30005         resources          joy
## 30006         resources     positive
## 30007         resources        trust
## 30008            excess     negative
## 30009              cool     positive
## 30010           convert     positive
## 30011       electricity     positive
## 30012         communism        anger
## 30013         communism         fear
## 30014         communism     negative
## 30015         communism      sadness
## 30016               don     positive
## 30017               don        trust
## 30018             panic         fear
## 30019             panic     negative
## 30020           abandon         fear
## 30021           abandon     negative
## 30022           abandon      sadness
## 30023           educate     positive
## 30024             cheap     negative
## 30025          friendly anticipation
## 30026          friendly          joy
## 30027          friendly     positive
## 30028          friendly        trust
## 30029              love          joy
## 30030              love     positive
## 30031              real     positive
## 30032              real        trust
## 30033              shit        anger
## 30034              shit      disgust
## 30035              shit     negative
## 30036           forward     positive
## 30037               bad        anger
## 30038               bad      disgust
## 30039               bad         fear
## 30040               bad     negative
## 30041               bad      sadness
## 30042        efficiency     positive
## 30043             shame      disgust
## 30044             shame         fear
## 30045             shame     negative
## 30046             shame      sadness
## 30047        technology     positive
## 30048             agree     positive
## 30049        depressing      disgust
## 30050        depressing     negative
## 30051        depressing      sadness
## 30052              real     positive
## 30053              real        trust
## 30054              late     negative
## 30055              late      sadness
## 30056         communist     negative
## 30057            system        trust
## 30058            larger      disgust
## 30059            larger     surprise
## 30060            larger        trust
## 30061           removal     negative
## 30062             drone     negative
## 30063             stark     negative
## 30064             stark        trust
## 30065             badly     negative
## 30066             badly      sadness
## 30067            change         fear
## 30068           corrupt     negative
## 30069            system        trust
## 30070          personal        trust
## 30071             greed        anger
## 30072             greed      disgust
## 30073             greed     negative
## 30074          designer     positive
## 30075          designer     positive
## 30076          designer     positive
## 30077            unfair        anger
## 30078            unfair      disgust
## 30079            unfair     negative
## 30080            unfair      sadness
## 30081         communism        anger
## 30082         communism         fear
## 30083         communism     negative
## 30084         communism      sadness
## 30085             abuse        anger
## 30086             abuse      disgust
## 30087             abuse         fear
## 30088             abuse     negative
## 30089             abuse      sadness
## 30090           maximum     positive
## 30091            reward anticipation
## 30092            reward          joy
## 30093            reward     positive
## 30094            reward     surprise
## 30095            reward        trust
## 30096             level     positive
## 30097             level        trust
## 30098              fair     positive
## 30099           killing        anger
## 30100           killing         fear
## 30101           killing     negative
## 30102           killing      sadness
## 30103              time anticipation
## 30104         resources          joy
## 30105         resources     positive
## 30106         resources        trust
## 30107         efficient anticipation
## 30108         efficient     positive
## 30109         efficient        trust
## 30110        accessible     positive
## 30111            create          joy
## 30112            create     positive
## 30113           beaming anticipation
## 30114           beaming          joy
## 30115           beaming     positive
## 30116          solution     positive
## 30117             proof        trust
## 30118            giving     positive
## 30119           network anticipation
## 30120             proof        trust
## 30121           blatant        anger
## 30122           blatant      disgust
## 30123           blatant     negative
## 30124            scheme     negative
## 30125       transaction        trust
## 30126               fee        anger
## 30127               fee     negative
## 30128               pay anticipation
## 30129               pay          joy
## 30130               pay     positive
## 30131               pay        trust
## 30132       transaction        trust
## 30133               fee        anger
## 30134               fee     negative
## 30135       transaction        trust
## 30136            pretty anticipation
## 30137            pretty          joy
## 30138            pretty     positive
## 30139            pretty        trust
## 30140         criticize        anger
## 30141         criticize      disgust
## 30142         criticize         fear
## 30143         criticize     negative
## 30144         criticize      sadness
## 30145         criticism        anger
## 30146         criticism     negative
## 30147         criticism      sadness
## 30148               fee        anger
## 30149               fee     negative
## 30150           payment     negative
## 30151         structure     positive
## 30152         structure        trust
## 30153               fee        anger
## 30154               fee     negative
## 30155             sense     positive
## 30156               fee        anger
## 30157               fee     negative
## 30158               fee        anger
## 30159               fee     negative
## 30160            credit     positive
## 30161            credit        trust
## 30162       transaction        trust
## 30163               pow        anger
## 30164              seek anticipation
## 30165              gain anticipation
## 30166              gain          joy
## 30167              gain     positive
## 30168            remove        anger
## 30169            remove         fear
## 30170            remove     negative
## 30171            remove      sadness
## 30172               pow        anger
## 30173             money        anger
## 30174             money anticipation
## 30175             money          joy
## 30176             money     positive
## 30177             money     surprise
## 30178             money        trust
## 30179              bank        trust
## 30180              bank        trust
## 30181             money        anger
## 30182             money anticipation
## 30183             money          joy
## 30184             money     positive
## 30185             money     surprise
## 30186             money        trust
## 30187          exchange     positive
## 30188          exchange        trust
## 30189       electricity     positive
## 30190             money        anger
## 30191             money anticipation
## 30192             money          joy
## 30193             money     positive
## 30194             money     surprise
## 30195             money        trust
## 30196              true          joy
## 30197              true     positive
## 30198              true        trust
## 30199          question     positive
## 30200              time anticipation
## 30201           healthy     positive
## 30202             alive anticipation
## 30203             alive          joy
## 30204             alive     positive
## 30205             alive        trust
## 30206             death        anger
## 30207             death anticipation
## 30208             death      disgust
## 30209             death         fear
## 30210             death     negative
## 30211             death      sadness
## 30212             death     surprise
## 30213             alive anticipation
## 30214             alive          joy
## 30215             alive     positive
## 30216             alive        trust
## 30217             death        anger
## 30218             death anticipation
## 30219             death      disgust
## 30220             death         fear
## 30221             death     negative
## 30222             death      sadness
## 30223             death     surprise
## 30224           healthy     positive
## 30225         stupidity     negative
## 30226              fool      disgust
## 30227              fool     negative
## 30228         knowledge     positive
## 30229              sick      disgust
## 30230              sick     negative
## 30231              sick      sadness
## 30232           healthy     positive
## 30233              true          joy
## 30234              true     positive
## 30235              true        trust
## 30236              fool      disgust
## 30237              fool     negative
## 30238           healthy     positive
## 30239             death        anger
## 30240             death anticipation
## 30241             death      disgust
## 30242             death         fear
## 30243             death     negative
## 30244             death      sadness
## 30245             death     surprise
## 30246         adversity        anger
## 30247         adversity         fear
## 30248         adversity     negative
## 30249         adversity      sadness
## 30250           suicide        anger
## 30251           suicide         fear
## 30252           suicide     negative
## 30253           suicide      sadness
## 30254             death        anger
## 30255             death anticipation
## 30256             death      disgust
## 30257             death         fear
## 30258             death     negative
## 30259             death      sadness
## 30260             death     surprise
## 30261               hot        anger
## 30262            defend         fear
## 30263            defend     positive
## 30264           foolish     negative
## 30265              love          joy
## 30266              love     positive
## 30267             shady         fear
## 30268             shady     negative
## 30269            public anticipation
## 30270            public     positive
## 30271          delusion        anger
## 30272          delusion         fear
## 30273          delusion     negative
## 30274          delusion      sadness
## 30275              cash        anger
## 30276              cash anticipation
## 30277              cash         fear
## 30278              cash          joy
## 30279              cash     positive
## 30280              cash        trust
## 30281            public anticipation
## 30282            public     positive
## 30283           illicit        anger
## 30284           illicit      disgust
## 30285           illicit         fear
## 30286           illicit     negative
## 30287             shady         fear
## 30288             shady     negative
## 30289           illicit        anger
## 30290           illicit      disgust
## 30291           illicit         fear
## 30292           illicit     negative
## 30293       transaction        trust
## 30294           promise          joy
## 30295           promise     positive
## 30296           promise        trust
## 30297         anonymous     negative
## 30298             truth     positive
## 30299             truth        trust
## 30300       transaction        trust
## 30301             track anticipation
## 30302           illegal        anger
## 30303           illegal      disgust
## 30304           illegal         fear
## 30305           illegal     negative
## 30306           illegal      sadness
## 30307       information     positive
## 30308           capture     negative
## 30309         prosecute        anger
## 30310         prosecute         fear
## 30311         prosecute     negative
## 30312         prosecute      sadness
## 30313           illicit        anger
## 30314           illicit      disgust
## 30315           illicit         fear
## 30316           illicit     negative
## 30317              cash        anger
## 30318              cash anticipation
## 30319              cash         fear
## 30320              cash          joy
## 30321              cash     positive
## 30322              cash        trust
## 30323             crime        anger
## 30324             crime     negative
## 30325              wont anticipation
## 30326              lead     positive
## 30327            policy        trust
## 30328          criminal        anger
## 30329          criminal      disgust
## 30330          criminal         fear
## 30331          criminal     negative
## 30332           default      disgust
## 30333           default         fear
## 30334           default     negative
## 30335           default      sadness
## 30336           default      disgust
## 30337           default         fear
## 30338           default     negative
## 30339           default      sadness
## 30340             clean          joy
## 30341             clean     positive
## 30342             clean        trust
## 30343           perfect anticipation
## 30344           perfect          joy
## 30345           perfect     positive
## 30346           perfect        trust
## 30347             solid     positive
## 30348           perfect anticipation
## 30349           perfect          joy
## 30350           perfect     positive
## 30351           perfect        trust
## 30352              cold     negative
## 30353              time anticipation
## 30354               bad        anger
## 30355               bad      disgust
## 30356               bad         fear
## 30357               bad     negative
## 30358               bad      sadness
## 30359             ahead     positive
## 30360           benefit     positive
## 30361         efficient anticipation
## 30362         efficient     positive
## 30363         efficient        trust
## 30364            ground        trust
## 30365          increase     positive
## 30366       responsible     positive
## 30367       responsible        trust
## 30368            center     positive
## 30369            center        trust
## 30370              time anticipation
## 30371          alarming         fear
## 30372          alarming     negative
## 30373          alarming     surprise
## 30374            happen anticipation
## 30375             enjoy anticipation
## 30376             enjoy          joy
## 30377             enjoy     positive
## 30378             enjoy        trust
## 30379         producing     positive
## 30380        production anticipation
## 30381        production     positive
## 30382             worse         fear
## 30383             worse     negative
## 30384             worse      sadness
## 30385          terrible        anger
## 30386          terrible      disgust
## 30387          terrible         fear
## 30388          terrible     negative
## 30389          terrible      sadness
## 30390             waste      disgust
## 30391             waste     negative
## 30392            bottom     negative
## 30393            bottom      sadness
## 30394               ash     negative
## 30395               ash     negative
## 30396         petroleum      disgust
## 30397         petroleum     negative
## 30398         petroleum     positive
## 30399             worse         fear
## 30400             worse     negative
## 30401             worse      sadness
## 30402           install anticipation
## 30403            system        trust
## 30404             trash      disgust
## 30405             trash     negative
## 30406             trash      sadness
## 30407              plan anticipation
## 30408            pretty anticipation
## 30409            pretty          joy
## 30410            pretty     positive
## 30411            pretty        trust
## 30412            ground        trust
## 30413              land     positive
## 30414               bog     negative
## 30415              land     positive
## 30416             green          joy
## 30417             green     positive
## 30418             green        trust
## 30419        production anticipation
## 30420        production     positive
## 30421             nasty        anger
## 30422             nasty      disgust
## 30423             nasty         fear
## 30424             nasty     negative
## 30425             nasty      sadness
## 30426         pollution      disgust
## 30427         pollution     negative
## 30428               hot        anger
## 30429              rock     positive
## 30430             green          joy
## 30431             green     positive
## 30432             green        trust
## 30433         surprised     surprise
## 30434        production anticipation
## 30435        production     positive
## 30436             nasty        anger
## 30437             nasty      disgust
## 30438             nasty         fear
## 30439             nasty     negative
## 30440             nasty      sadness
## 30441         pollution      disgust
## 30442         pollution     negative
## 30443               hot        anger
## 30444              rock     positive
## 30445         producing     positive
## 30446            cement anticipation
## 30447            cement        trust
## 30448          grinding     negative
## 30449         curiosity anticipation
## 30450         curiosity     positive
## 30451         curiosity     surprise
## 30452              word     positive
## 30453              word        trust
## 30454        production anticipation
## 30455        production     positive
## 30456             worse         fear
## 30457             worse     negative
## 30458             worse      sadness
## 30459              hope anticipation
## 30460              hope          joy
## 30461              hope     positive
## 30462              hope     surprise
## 30463              hope        trust
## 30464              mail anticipation
## 30465              food          joy
## 30466              food     positive
## 30467              food        trust
## 30468               tax     negative
## 30469               tax      sadness
## 30470         encourage          joy
## 30471         encourage     positive
## 30472         encourage        trust
## 30473              food          joy
## 30474              food     positive
## 30475              food        trust
## 30476            supply     positive
## 30477         traveling     positive
## 30478              time anticipation
## 30479            friend          joy
## 30480            friend     positive
## 30481            friend        trust
## 30482         traveling     positive
## 30483             agree     positive
## 30484               don     positive
## 30485               don        trust
## 30486              true          joy
## 30487              true     positive
## 30488              true        trust
## 30489           harmful        anger
## 30490           harmful      disgust
## 30491           harmful         fear
## 30492           harmful     negative
## 30493           harmful      sadness
## 30494             agree     positive
## 30495         knowledge     positive
## 30496         structure     positive
## 30497         structure        trust
## 30498         effective     positive
## 30499         effective        trust
## 30500           harmful        anger
## 30501           harmful      disgust
## 30502           harmful         fear
## 30503           harmful     negative
## 30504           harmful      sadness
## 30505         producing     positive
## 30506             focus     positive
## 30507       maintenance        trust
## 30508              heal          joy
## 30509              heal     positive
## 30510              heal        trust
## 30511             stone        anger
## 30512             stone     negative
## 30513             found          joy
## 30514             found     positive
## 30515             found        trust
## 30516              main     positive
## 30517             focus     positive
## 30518             build     positive
## 30519          building     positive
## 30520             build     positive
## 30521             build     positive
## 30522             green          joy
## 30523             green     positive
## 30524             green        trust
## 30525            supply     positive
## 30526             civil     positive
## 30527        production anticipation
## 30528        production     positive
## 30529          minimize     negative
## 30530      architecture        trust
## 30531          minimize     negative
## 30532            decent     positive
## 30533            cement anticipation
## 30534            cement        trust
## 30535            cement anticipation
## 30536            cement        trust
## 30537            cement anticipation
## 30538            cement        trust
## 30539            cement anticipation
## 30540            cement        trust
## 30541          solution     positive
## 30542               fun anticipation
## 30543               fun          joy
## 30544               fun     positive
## 30545        disgusting        anger
## 30546        disgusting      disgust
## 30547        disgusting         fear
## 30548        disgusting     negative
## 30549            flying         fear
## 30550            flying     positive
## 30551            flying         fear
## 30552            flying     positive
## 30553          personal        trust
## 30554           killing        anger
## 30555           killing         fear
## 30556           killing     negative
## 30557           killing      sadness
## 30558            stupid     negative
## 30559         terrorism        anger
## 30560         terrorism      disgust
## 30561         terrorism         fear
## 30562         terrorism     negative
## 30563         terrorism      sadness
## 30564              kill         fear
## 30565              kill     negative
## 30566              kill      sadness
## 30567               die         fear
## 30568               die     negative
## 30569               die      sadness
## 30570          friendly anticipation
## 30571          friendly          joy
## 30572          friendly     positive
## 30573          friendly        trust
## 30574               don     positive
## 30575               don        trust
## 30576          familiar     positive
## 30577          familiar        trust
## 30578           killing        anger
## 30579           killing         fear
## 30580           killing     negative
## 30581           killing      sadness
## 30582             crazy        anger
## 30583             crazy         fear
## 30584             crazy     negative
## 30585             crazy      sadness
## 30586            option     positive
## 30587              plan anticipation
## 30588        population     positive
## 30589              time anticipation
## 30590              plan anticipation
## 30591            action     positive
## 30592              main     positive
## 30593            reason     positive
## 30594              kill         fear
## 30595              kill     negative
## 30596              kill      sadness
## 30597          continue anticipation
## 30598          continue     positive
## 30599          continue        trust
## 30600            change         fear
## 30601               top anticipation
## 30602               top     positive
## 30603               top        trust
## 30604            change         fear
## 30605               top anticipation
## 30606               top     positive
## 30607               top        trust
## 30608            change         fear
## 30609            august     positive
## 30610             green          joy
## 30611             green     positive
## 30612             green        trust
## 30613             green          joy
## 30614             green     positive
## 30615             green        trust
## 30616        contribute     positive
## 30617            august     positive
## 30618             green          joy
## 30619             green     positive
## 30620             green        trust
## 30621             green          joy
## 30622             green     positive
## 30623             green        trust
## 30624        contribute     positive
## 30625              shit        anger
## 30626              shit      disgust
## 30627              shit     negative
## 30628            change         fear
## 30629         disappear         fear
## 30630        completely     positive
## 30631               eat     positive
## 30632             happy anticipation
## 30633             happy          joy
## 30634             happy     positive
## 30635             happy        trust
## 30636            master     positive
## 30637              wait anticipation
## 30638              wait     negative
## 30639          terrible        anger
## 30640          terrible      disgust
## 30641          terrible         fear
## 30642          terrible     negative
## 30643          terrible      sadness
## 30644     understanding     positive
## 30645     understanding        trust
## 30646         replenish     positive
## 30647              soil      disgust
## 30648              soil     negative
## 30649              shit        anger
## 30650              shit      disgust
## 30651              shit     negative
## 30652             toxic      disgust
## 30653             toxic     negative
## 30654       inefficient     negative
## 30655       inefficient      sadness
## 30656         pollution      disgust
## 30657         pollution     negative
## 30658           chicken         fear
## 30659              love          joy
## 30660              love     positive
## 30661             guess     surprise
## 30662             ashes     negative
## 30663             ashes      sadness
## 30664            degree     positive
## 30665          intended anticipation
## 30666          intended     positive
## 30667             waste      disgust
## 30668             waste     negative
## 30669              food          joy
## 30670              food     positive
## 30671              food        trust
## 30672        euthanasia         fear
## 30673        euthanasia     negative
## 30674        euthanasia      sadness
## 30675         slaughter        anger
## 30676         slaughter      disgust
## 30677         slaughter         fear
## 30678         slaughter     negative
## 30679         slaughter      sadness
## 30680         slaughter     surprise
## 30681        euthanasia         fear
## 30682        euthanasia     negative
## 30683        euthanasia      sadness
## 30684              shit        anger
## 30685              shit      disgust
## 30686              shit     negative
## 30687               eat     positive
## 30688             worse         fear
## 30689             worse     negative
## 30690             worse      sadness
## 30691             happy anticipation
## 30692             happy          joy
## 30693             happy     positive
## 30694             happy        trust
## 30695           promise          joy
## 30696           promise     positive
## 30697           promise        trust
## 30698             swear     positive
## 30699             swear        trust
## 30700           promise          joy
## 30701           promise     positive
## 30702           promise        trust
## 30703        manipulate     negative
## 30704             happy anticipation
## 30705             happy          joy
## 30706             happy     positive
## 30707             happy        trust
## 30708              late     negative
## 30709              late      sadness
## 30710         gravitate anticipation
## 30711         socialism      disgust
## 30712         socialism         fear
## 30713             diary          joy
## 30714             diary     positive
## 30715             diary        trust
## 30716         dependent     negative
## 30717         dependent     positive
## 30718         dependent        trust
## 30719              dear     positive
## 30720             diary          joy
## 30721             diary     positive
## 30722             diary        trust
## 30723            larger      disgust
## 30724            larger     surprise
## 30725            larger        trust
## 30726           account        trust
## 30727             diary          joy
## 30728             diary     positive
## 30729             diary        trust
## 30730         producing     positive
## 30731            scheme     negative
## 30732              bite     negative
## 30733              time anticipation
## 30734       agriculture     positive
## 30735           include     positive
## 30736           minimum     negative
## 30737          building     positive
## 30738               ass     negative
## 30739               ass     negative
## 30740         surprised     surprise
## 30741              shit        anger
## 30742              shit      disgust
## 30743              shit     negative
## 30744               ass     negative
## 30745            change         fear
## 30746      disingenuous      disgust
## 30747      disingenuous     negative
## 30748          electric          joy
## 30749          electric     positive
## 30750          electric     surprise
## 30751          electric          joy
## 30752          electric     positive
## 30753          electric     surprise
## 30754              true          joy
## 30755              true     positive
## 30756              true        trust
## 30757              dust     negative
## 30758              dust     negative
## 30759           account        trust
## 30760         pollution      disgust
## 30761         pollution     negative
## 30762            actual     positive
## 30763           exhaust     negative
## 30764          electric          joy
## 30765          electric     positive
## 30766          electric     surprise
## 30767           related        trust
## 30768           account        trust
## 30769           battery        anger
## 30770           battery     negative
## 30771        production anticipation
## 30772        production     positive
## 30773             focus     positive
## 30774          electric          joy
## 30775          electric     positive
## 30776          electric     surprise
## 30777             focus     positive
## 30778          building     positive
## 30779          electric          joy
## 30780          electric     positive
## 30781          electric     surprise
## 30782        successful anticipation
## 30783        successful          joy
## 30784        successful     positive
## 30785        successful        trust
## 30786             sense     positive
## 30787             guess     surprise
## 30788              shit        anger
## 30789              shit      disgust
## 30790              shit     negative
## 30791              fits        anger
## 30792              fits     negative
## 30793          solution     positive
## 30794            leader     positive
## 30795            leader        trust
## 30796            leader     positive
## 30797            leader        trust
## 30798            change         fear
## 30799              time anticipation
## 30800              wait anticipation
## 30801              wait     negative
## 30802              lead     positive
## 30803              food          joy
## 30804              food     positive
## 30805              food        trust
## 30806            supply     positive
## 30807              grow anticipation
## 30808              grow          joy
## 30809              grow     positive
## 30810              grow        trust
## 30811              grow anticipation
## 30812              grow          joy
## 30813              grow     positive
## 30814              grow        trust
## 30815            weight anticipation
## 30816            weight      disgust
## 30817            weight         fear
## 30818            weight          joy
## 30819            weight     negative
## 30820            weight     positive
## 30821            weight      sadness
## 30822            weight     surprise
## 30823            weight        trust
## 30824     insignificant        anger
## 30825     insignificant     negative
## 30826     insignificant      sadness
## 30827         resources          joy
## 30828         resources     positive
## 30829         resources        trust
## 30830              grow anticipation
## 30831              grow          joy
## 30832              grow     positive
## 30833              grow        trust
## 30834         resources          joy
## 30835         resources     positive
## 30836         resources        trust
## 30837            nation        trust
## 30838         pollution      disgust
## 30839         pollution     negative
## 30840             gross      disgust
## 30841             gross     negative
## 30842        population     positive
## 30843        population     positive
## 30844           pillage        anger
## 30845           pillage      disgust
## 30846           pillage         fear
## 30847           pillage     negative
## 30848             start anticipation
## 30849          standing     positive
## 30850             worse         fear
## 30851             worse     negative
## 30852             worse      sadness
## 30853            combat        anger
## 30854            combat         fear
## 30855            combat     negative
## 30856              bear        anger
## 30857              bear         fear
## 30858             court        anger
## 30859             court anticipation
## 30860             court         fear
## 30861          progress anticipation
## 30862          progress          joy
## 30863          progress     positive
## 30864         miserable        anger
## 30865         miserable      disgust
## 30866         miserable     negative
## 30867         miserable      sadness
## 30868        population     positive
## 30869             fixed        trust
## 30870            public anticipation
## 30871            public     positive
## 30872          humanity          joy
## 30873          humanity     positive
## 30874          humanity        trust
## 30875          educated     positive
## 30876           educate     positive
## 30877             lower     negative
## 30878             lower      sadness
## 30879          absolute     positive
## 30880           poverty        anger
## 30881           poverty      disgust
## 30882           poverty         fear
## 30883           poverty     negative
## 30884           poverty      sadness
## 30885             polio         fear
## 30886             polio     negative
## 30887             polio      sadness
## 30888          accurate     positive
## 30889          accurate        trust
## 30890          registry        trust
## 30891        population     positive
## 30892            center     positive
## 30893            center        trust
## 30894               die         fear
## 30895               die     negative
## 30896               die      sadness
## 30897         dysentery      disgust
## 30898         dysentery     negative
## 30899         dysentery      sadness
## 30900           immoral        anger
## 30901           immoral      disgust
## 30902           immoral         fear
## 30903           immoral     negative
## 30904           immoral      sadness
## 30905            insane        anger
## 30906            insane         fear
## 30907            insane     negative
## 30908        government         fear
## 30909        government     negative
## 30910            demand        anger
## 30911            demand     negative
## 30912           killing        anger
## 30913           killing         fear
## 30914           killing     negative
## 30915           killing      sadness
## 30916            theory anticipation
## 30917            theory        trust
## 30918          nonsense     negative
## 30919           killing        anger
## 30920           killing         fear
## 30921           killing     negative
## 30922           killing      sadness
## 30923           killing        anger
## 30924           killing         fear
## 30925           killing     negative
## 30926           killing      sadness
## 30927           killing        anger
## 30928           killing         fear
## 30929           killing     negative
## 30930           killing      sadness
## 30931              farm anticipation
## 30932               die         fear
## 30933               die     negative
## 30934               die      sadness
## 30935              farm anticipation
## 30936            theory anticipation
## 30937            theory        trust
## 30938           special          joy
## 30939           special     positive
## 30940         scientist anticipation
## 30941         scientist     positive
## 30942         scientist        trust
## 30943           chemist     positive
## 30944           chemist        trust
## 30945             sense     positive
## 30946           villain         fear
## 30947           villain     negative
## 30948           villain         fear
## 30949           villain     negative
## 30950          infinite     positive
## 30951            supply     positive
## 30952             sense     positive
## 30953               bad        anger
## 30954               bad      disgust
## 30955               bad         fear
## 30956               bad     negative
## 30957               bad      sadness
## 30958               bad        anger
## 30959               bad      disgust
## 30960               bad         fear
## 30961               bad     negative
## 30962               bad      sadness
## 30963            rising anticipation
## 30964            rising          joy
## 30965            rising     positive
## 30966        revolution        anger
## 30967        revolution anticipation
## 30968        revolution         fear
## 30969        revolution     negative
## 30970        revolution     positive
## 30971        revolution      sadness
## 30972        revolution     surprise
## 30973             silly          joy
## 30974             silly     negative
## 30975           missing         fear
## 30976           missing     negative
## 30977           missing      sadness
## 30978              deny        anger
## 30979              deny     negative
## 30980              true          joy
## 30981              true     positive
## 30982              true        trust
## 30983          relative        trust
## 30984          increase     positive
## 30985           respect anticipation
## 30986           respect          joy
## 30987           respect     positive
## 30988           respect        trust
## 30989           chemist     positive
## 30990           chemist        trust
## 30991         physicist        trust
## 30992            theory anticipation
## 30993            theory        trust
## 30994      disagreement        anger
## 30995      disagreement     negative
## 30996      disagreement      sadness
## 30997       established          joy
## 30998       established     positive
## 30999            proven        trust
## 31000             sense     positive
## 31001          argument        anger
## 31002          argument     negative
## 31003              deny        anger
## 31004              deny     negative
## 31005              true          joy
## 31006              true     positive
## 31007              true        trust
## 31008            debate     positive
## 31009            pigeon     negative
## 31010           balance     positive
## 31011        impossible     negative
## 31012        impossible      sadness
## 31013             prove     positive
## 31014          personal        trust
## 31015           ability     positive
## 31016             start anticipation
## 31017          measured     positive
## 31018          measured        trust
## 31019         arguments        anger
## 31020             wrong     negative
## 31021       fundamental     positive
## 31022       fundamental        trust
## 31023               law        trust
## 31024            theory anticipation
## 31025            theory        trust
## 31026               law        trust
## 31027               law        trust
## 31028            theory anticipation
## 31029            theory        trust
## 31030            proven        trust
## 31031             wrong     negative
## 31032           physics     positive
## 31033            theory anticipation
## 31034            theory        trust
## 31035           nullify     negative
## 31036           nullify     surprise
## 31037       fundamental     positive
## 31038       fundamental        trust
## 31039               law        trust
## 31040       fundamental     positive
## 31041       fundamental        trust
## 31042            theory anticipation
## 31043            theory        trust
## 31044         agreement     positive
## 31045         agreement        trust
## 31046           physics     positive
## 31047        ultimately anticipation
## 31048        ultimately     positive
## 31049            system        trust
## 31050               law        trust
## 31051               law        trust
## 31052           physics     positive
## 31053             agree     positive
## 31054               law        trust
## 31055       agriculture     positive
## 31056       agriculture     positive
## 31057              land     positive
## 31058             focus     positive
## 31059       agriculture     positive
## 31060           neutral anticipation
## 31061           neutral        trust
## 31062            pretty anticipation
## 31063            pretty          joy
## 31064            pretty     positive
## 31065            pretty        trust
## 31066          kerosene         fear
## 31067            bunker         fear
## 31068        production anticipation
## 31069        production     positive
## 31070           benefit     positive
## 31071            change         fear
## 31072            stupid     negative
## 31073       agriculture     positive
## 31074            proven        trust
## 31075         believing     positive
## 31076         believing        trust
## 31077              real     positive
## 31078              real        trust
## 31079               don     positive
## 31080               don        trust
## 31081             silly          joy
## 31082             silly     negative
## 31083            happen anticipation
## 31084             proof        trust
## 31085             proof        trust
## 31086               bad        anger
## 31087               bad      disgust
## 31088               bad         fear
## 31089               bad     negative
## 31090               bad      sadness
## 31091             faith anticipation
## 31092             faith          joy
## 31093             faith     positive
## 31094             faith        trust
## 31095               bad        anger
## 31096               bad      disgust
## 31097               bad         fear
## 31098               bad     negative
## 31099               bad      sadness
## 31100         arguments        anger
## 31101            choice     positive
## 31102             guess     surprise
## 31103            theory anticipation
## 31104            theory        trust
## 31105             proof        trust
## 31106          educated     positive
## 31107         scientist anticipation
## 31108         scientist     positive
## 31109         scientist        trust
## 31110          nonsense     negative
## 31111               don     positive
## 31112               don        trust
## 31113             grant anticipation
## 31114             grant          joy
## 31115             grant     positive
## 31116             grant        trust
## 31117           academy     positive
## 31118              real     positive
## 31119              real        trust
## 31120            reason     positive
## 31121             trend     positive
## 31122          measured     positive
## 31123          measured        trust
## 31124          educated     positive
## 31125         scientist anticipation
## 31126         scientist     positive
## 31127         scientist        trust
## 31128             horse        trust
## 31129          educated     positive
## 31130         scientist anticipation
## 31131         scientist     positive
## 31132         scientist        trust
## 31133        confidence         fear
## 31134        confidence          joy
## 31135        confidence     positive
## 31136        confidence        trust
## 31137            insane        anger
## 31138            insane         fear
## 31139            insane     negative
## 31140        uneducated     negative
## 31141        uneducated      sadness
## 31142             sadly     negative
## 31143             sadly      sadness
## 31144           lacking     negative
## 31145            brains     positive
## 31146               lie        anger
## 31147               lie      disgust
## 31148               lie     negative
## 31149               lie      sadness
## 31150            drivel      disgust
## 31151            drivel     negative
## 31152        scientific     positive
## 31153        scientific        trust
## 31154            theory anticipation
## 31155            theory        trust
## 31156            theory anticipation
## 31157            theory        trust
## 31158        scientific     positive
## 31159        scientific        trust
## 31160            theory anticipation
## 31161            theory        trust
## 31162        scientific     positive
## 31163        scientific        trust
## 31164          educated     positive
## 31165              word     positive
## 31166              word        trust
## 31167            theory anticipation
## 31168            theory        trust
## 31169              kill         fear
## 31170              kill     negative
## 31171              kill      sadness
## 31172           useless     negative
## 31173             guess     surprise
## 31174            crisis     negative
## 31175            crisis     negative
## 31176         including     positive
## 31177       destruction        anger
## 31178       destruction     negative
## 31179               hot        anger
## 31180              time anticipation
## 31181               bad        anger
## 31182               bad      disgust
## 31183               bad         fear
## 31184               bad     negative
## 31185               bad      sadness
## 31186             worse         fear
## 31187             worse     negative
## 31188             worse      sadness
## 31189             death        anger
## 31190             death anticipation
## 31191             death      disgust
## 31192             death         fear
## 31193             death     negative
## 31194             death      sadness
## 31195             death     surprise
## 31196            happen anticipation
## 31197             agree     positive
## 31198             worse         fear
## 31199             worse     negative
## 31200             worse      sadness
## 31201             haven     positive
## 31202             haven        trust
## 31203            absent     negative
## 31204            absent      sadness
## 31205            ascent     positive
## 31206             sense     positive
## 31207           prepare anticipation
## 31208           prepare     positive
## 31209          planning anticipation
## 31210          planning     positive
## 31211          planning        trust
## 31212       agriculture     positive
## 31213        management     positive
## 31214        management        trust
## 31215               fun anticipation
## 31216               fun          joy
## 31217               fun     positive
## 31218              lush      disgust
## 31219              lush     negative
## 31220              lush      sadness
## 31221       ineffective     negative
## 31222              grow anticipation
## 31223              grow          joy
## 31224              grow     positive
## 31225              grow        trust
## 31226          producer     positive
## 31227              arid     negative
## 31228              arid      sadness
## 31229               eat     positive
## 31230               rot      disgust
## 31231               rot         fear
## 31232               rot     negative
## 31233               rot      sadness
## 31234           bedrock     positive
## 31235           bedrock        trust
## 31236            hungry anticipation
## 31237            hungry     negative
## 31238           compost      disgust
## 31239           compost     negative
## 31240        production anticipation
## 31241        production     positive
## 31242            happen anticipation
## 31243             start anticipation
## 31244             cheap     negative
## 31245             toxic      disgust
## 31246             toxic     negative
## 31247     unsustainable     negative
## 31248       agriculture     positive
## 31249              soil      disgust
## 31250              soil     negative
## 31251          sabotage        anger
## 31252          sabotage      disgust
## 31253          sabotage         fear
## 31254          sabotage     negative
## 31255          sabotage      sadness
## 31256          sabotage     surprise
## 31257         organized     positive
## 31258           economy        trust
## 31259            leader     positive
## 31260            leader        trust
## 31261              food          joy
## 31262              food     positive
## 31263              food        trust
## 31264              food          joy
## 31265              food     positive
## 31266              food        trust
## 31267        production anticipation
## 31268        production     positive
## 31269              cull     negative
## 31270        population     positive
## 31271            result anticipation
## 31272           culprit     negative
## 31273            change         fear
## 31274               die         fear
## 31275               die     negative
## 31276               die      sadness
## 31277        scientific     positive
## 31278        scientific        trust
## 31279          nonsense     negative
## 31280       responsible     positive
## 31281       responsible        trust
## 31282            idiocy        anger
## 31283            idiocy      disgust
## 31284            idiocy     negative
## 31285            idiocy      sadness
## 31286       immediately anticipation
## 31287       immediately     negative
## 31288       immediately     positive
## 31289            public anticipation
## 31290            public     positive
## 31291             enemy        anger
## 31292             enemy      disgust
## 31293             enemy         fear
## 31294             enemy     negative
## 31295        population     positive
## 31296             visit     positive
## 31297             visit     positive
## 31298           pasture     positive
## 31299             guess     surprise
## 31300           explain     positive
## 31301           explain        trust
## 31302          reliance     positive
## 31303          reliance        trust
## 31304           pasture     positive
## 31305           organic     positive
## 31306         producing     positive
## 31307           pasture     positive
## 31308              soil      disgust
## 31309              soil     negative
## 31310           fertile     positive
## 31311       agriculture     positive
## 31312              soil      disgust
## 31313              soil     negative
## 31314            manure      disgust
## 31315            manure     negative
## 31316            system        trust
## 31317              soil      disgust
## 31318              soil     negative
## 31319              soil      disgust
## 31320              soil     negative
## 31321              grow anticipation
## 31322              grow          joy
## 31323              grow     positive
## 31324              grow        trust
## 31325               bad        anger
## 31326               bad      disgust
## 31327               bad         fear
## 31328               bad     negative
## 31329               bad      sadness
## 31330            offset anticipation
## 31331            offset     positive
## 31332             dirty      disgust
## 31333             dirty     negative
## 31334               sea     positive
## 31335          pandemic         fear
## 31336          pandemic     negative
## 31337          pandemic      sadness
## 31338          shopping anticipation
## 31339          shopping          joy
## 31340          shopping     positive
## 31341          shopping     surprise
## 31342          shopping        trust
## 31343             dirty      disgust
## 31344             dirty     negative
## 31345             learn     positive
## 31346         producing     positive
## 31347        completely     positive
## 31348            extend     positive
## 31349        production anticipation
## 31350        production     positive
## 31351          decrease     negative
## 31352           content          joy
## 31353           content     positive
## 31354           content        trust
## 31355         destroyed        anger
## 31356         destroyed         fear
## 31357         destroyed     negative
## 31358         destroyed      sadness
## 31359           pasture     positive
## 31360         including     positive
## 31361         temperate        trust
## 31362               bad        anger
## 31363               bad      disgust
## 31364               bad         fear
## 31365               bad     negative
## 31366               bad      sadness
## 31367            offset anticipation
## 31368            offset     positive
## 31369              food          joy
## 31370              food     positive
## 31371              food        trust
## 31372        production anticipation
## 31373        production     positive
## 31374         temperate        trust
## 31375             ahead     positive
## 31376        impossible     negative
## 31377        impossible      sadness
## 31378        production anticipation
## 31379        production     positive
## 31380              iron     positive
## 31381              iron        trust
## 31382              food          joy
## 31383              food     positive
## 31384              food        trust
## 31385           finally anticipation
## 31386           finally      disgust
## 31387           finally          joy
## 31388           finally     positive
## 31389           finally     surprise
## 31390           finally        trust
## 31391          suppress        anger
## 31392          suppress         fear
## 31393          suppress     negative
## 31394          suppress      sadness
## 31395            reason     positive
## 31396          increase     positive
## 31397            hungry anticipation
## 31398            hungry     negative
## 31399              soil      disgust
## 31400              soil     negative
## 31401           harvest anticipation
## 31402           harvest          joy
## 31403           harvest     positive
## 31404              true          joy
## 31405              true     positive
## 31406              true        trust
## 31407          accounts        trust
## 31408             gross      disgust
## 31409             gross     negative
## 31410       agriculture     positive
## 31411          isolated         fear
## 31412          isolated     negative
## 31413          isolated      sadness
## 31414            actual     positive
## 31415         replenish     positive
## 31416            happen anticipation
## 31417               ban     negative
## 31418              food          joy
## 31419              food     positive
## 31420              food        trust
## 31421            damage        anger
## 31422            damage      disgust
## 31423            damage     negative
## 31424            damage      sadness
## 31425           pasture     positive
## 31426               ban     negative
## 31427              lead     positive
## 31428            decent     positive
## 31429              grow anticipation
## 31430              grow          joy
## 31431              grow     positive
## 31432              grow        trust
## 31433              land     positive
## 31434           cripple         fear
## 31435           cripple     negative
## 31436           cripple      sadness
## 31437       agriculture     positive
## 31438         dependent     negative
## 31439         dependent     positive
## 31440         dependent        trust
## 31441              land     positive
## 31442              food          joy
## 31443              food     positive
## 31444              food        trust
## 31445              food          joy
## 31446              food     positive
## 31447              food        trust
## 31448              land     positive
## 31449               top anticipation
## 31450               top     positive
## 31451               top        trust
## 31452           pasture     positive
## 31453            unable     negative
## 31454            unable      sadness
## 31455         offensive        anger
## 31456         offensive      disgust
## 31457         offensive     negative
## 31458              cull     negative
## 31459              time anticipation
## 31460             adapt     positive
## 31461               ban     negative
## 31462              lead     positive
## 31463              time anticipation
## 31464           useless     negative
## 31465             force        anger
## 31466             force         fear
## 31467             force     negative
## 31468             adapt     positive
## 31469            actual     positive
## 31470             green          joy
## 31471             green     positive
## 31472             green        trust
## 31473           economy        trust
## 31474              time anticipation
## 31475            supply     positive
## 31476            demand        anger
## 31477            demand     negative
## 31478          increase     positive
## 31479           butcher        anger
## 31480           butcher      disgust
## 31481           butcher         fear
## 31482           butcher     negative
## 31483            forced         fear
## 31484            forced     negative
## 31485              cull     negative
## 31486            absurd     negative
## 31487           measure        trust
## 31488              farm anticipation
## 31489          question     positive
## 31490        government         fear
## 31491        government     negative
## 31492          scarcity        anger
## 31493          scarcity         fear
## 31494          scarcity     negative
## 31495          scarcity      sadness
## 31496          scarcity        anger
## 31497          scarcity         fear
## 31498          scarcity     negative
## 31499          scarcity      sadness
## 31500           gauging        trust
## 31501              cull     negative
## 31502              food          joy
## 31503              food     positive
## 31504              food        trust
## 31505            crisis     negative
## 31506            offset anticipation
## 31507            offset     positive
## 31508             store anticipation
## 31509             store     positive
## 31510       destructive        anger
## 31511       destructive      disgust
## 31512       destructive         fear
## 31513       destructive     negative
## 31514            greedy      disgust
## 31515            greedy     negative
## 31516          scarcity        anger
## 31517          scarcity         fear
## 31518          scarcity     negative
## 31519          scarcity      sadness
## 31520            create          joy
## 31521            create     positive
## 31522           confuse     negative
## 31523        depressing      disgust
## 31524        depressing     negative
## 31525        depressing      sadness
## 31526          vigilant         fear
## 31527          vigilant     positive
## 31528          vigilant        trust
## 31529            crisis     negative
## 31530           benefit     positive
## 31531            excuse     negative
## 31532            action     positive
## 31533              kill         fear
## 31534              kill     negative
## 31535              kill      sadness
## 31536              ship anticipation
## 31537            stupid     negative
## 31538               bad        anger
## 31539               bad      disgust
## 31540               bad         fear
## 31541               bad     negative
## 31542               bad      sadness
## 31543               die         fear
## 31544               die     negative
## 31545               die      sadness
## 31546            stupid     negative
## 31547           suicide        anger
## 31548           suicide         fear
## 31549           suicide     negative
## 31550           suicide      sadness
## 31551              save          joy
## 31552              save     positive
## 31553              save        trust
## 31554            change         fear
## 31555           logical     positive
## 31556            debate     positive
## 31557         slaughter        anger
## 31558         slaughter      disgust
## 31559         slaughter         fear
## 31560         slaughter     negative
## 31561         slaughter      sadness
## 31562         slaughter     surprise
## 31563             toxic      disgust
## 31564             toxic     negative
## 31565             proof        trust
## 31566            change         fear
## 31567              dumb     negative
## 31568             doubt         fear
## 31569             doubt     negative
## 31570             doubt      sadness
## 31571             doubt        trust
## 31572            change         fear
## 31573              harm         fear
## 31574              harm     negative
## 31575          starving     negative
## 31576             green          joy
## 31577             green     positive
## 31578             green        trust
## 31579               eat     positive
## 31580          starving     negative
## 31581            change         fear
## 31582              food          joy
## 31583              food     positive
## 31584              food        trust
## 31585            crisis     negative
## 31586            stupid     negative
## 31587            leader     positive
## 31588            leader        trust
## 31589              food          joy
## 31590              food     positive
## 31591              food        trust
## 31592               war         fear
## 31593               war     negative
## 31594           machine        trust
## 31595            stupid     negative
## 31596           reading     positive
## 31597           defense        anger
## 31598           defense anticipation
## 31599           defense         fear
## 31600           defense     positive
## 31601       agriculture     positive
## 31602            stupid     negative
## 31603              kill         fear
## 31604              kill     negative
## 31605              kill      sadness
## 31606          restrict     negative
## 31607          restrict      sadness
## 31608            regret     negative
## 31609            regret      sadness
## 31610             crazy        anger
## 31611             crazy         fear
## 31612             crazy     negative
## 31613             crazy      sadness
## 31614              food          joy
## 31615              food     positive
## 31616              food        trust
## 31617              kill         fear
## 31618              kill     negative
## 31619              kill      sadness
## 31620       electricity     positive
## 31621        conspiracy         fear
## 31622            theory anticipation
## 31623            theory        trust
## 31624             truth     positive
## 31625             truth        trust
## 31626              kill         fear
## 31627              kill     negative
## 31628              kill      sadness
## 31629             lower     negative
## 31630             lower      sadness
## 31631               eat     positive
## 31632             words        anger
## 31633             words     negative
## 31634            result anticipation
## 31635            forced         fear
## 31636            forced     negative
## 31637            demand        anger
## 31638            demand     negative
## 31639            demand        anger
## 31640            demand     negative
## 31641            supply     positive
## 31642              lead     positive
## 31643            unable     negative
## 31644            unable      sadness
## 31645            afford     positive
## 31646            stupid     negative
## 31647            afford     positive
## 31648              kill         fear
## 31649              kill     negative
## 31650              kill      sadness
## 31651            stupid     negative
## 31652            nation        trust
## 31653           killing        anger
## 31654           killing         fear
## 31655           killing     negative
## 31656           killing      sadness
## 31657             agree     positive
## 31658               eat     positive
## 31659            punish         fear
## 31660            punish     negative
## 31661              shot        anger
## 31662              shot         fear
## 31663              shot     negative
## 31664              shot      sadness
## 31665              shot     surprise
## 31666            buried         fear
## 31667            buried     negative
## 31668            buried      sadness
## 31669              plan anticipation
## 31670              food          joy
## 31671              food     positive
## 31672              food        trust
## 31673          forcibly        anger
## 31674          forcibly         fear
## 31675          forcibly     negative
## 31676             title     positive
## 31677             title        trust
## 31678              kill         fear
## 31679              kill     negative
## 31680              kill      sadness
## 31681             cheap     negative
## 31682            ground        trust
## 31683             cheap     negative
## 31684               eat     positive
## 31685               eat     positive
## 31686           citizen     positive
## 31687              calm     positive
## 31688             wrath        anger
## 31689             wrath         fear
## 31690             wrath     negative
## 31691               don     positive
## 31692               don        trust
## 31693              shit        anger
## 31694              shit      disgust
## 31695              shit     negative
## 31696            change         fear
## 31697              clue anticipation
## 31698         sickening        anger
## 31699         sickening      disgust
## 31700         sickening         fear
## 31701         sickening     negative
## 31702         sickening      sadness
## 31703              kill         fear
## 31704              kill     negative
## 31705              kill      sadness
## 31706            change         fear
## 31707              kill         fear
## 31708              kill     negative
## 31709              kill      sadness
## 31710            action     positive
## 31711       agriculture     positive
## 31712       devastating        anger
## 31713       devastating      disgust
## 31714       devastating         fear
## 31715       devastating     negative
## 31716       devastating      sadness
## 31717       devastating        trust
## 31718           cutting        anger
## 31719           cutting      disgust
## 31720           cutting         fear
## 31721           cutting     negative
## 31722           cutting      sadness
## 31723             worse         fear
## 31724             worse     negative
## 31725             worse      sadness
## 31726               sea     positive
## 31727               hit        anger
## 31728               hit     negative
## 31729              hell        anger
## 31730              hell      disgust
## 31731              hell         fear
## 31732              hell     negative
## 31733              hell      sadness
## 31734             storm        anger
## 31735             storm     negative
## 31736              risk anticipation
## 31737              risk         fear
## 31738              risk     negative
## 31739          wildfire         fear
## 31740          wildfire     negative
## 31741          wildfire      sadness
## 31742          wildfire     surprise
## 31743          monument     positive
## 31744           crystal     positive
## 31745         suffering      disgust
## 31746         suffering         fear
## 31747         suffering     negative
## 31748         suffering      sadness
## 31749             start anticipation
## 31750               war         fear
## 31751               war     negative
## 31752            effort     positive
## 31753            combat        anger
## 31754            combat         fear
## 31755            combat     negative
## 31756               hit        anger
## 31757               hit     negative
## 31758         resilient     positive
## 31759            afford     positive
## 31760               bad        anger
## 31761               bad      disgust
## 31762               bad         fear
## 31763               bad     negative
## 31764               bad      sadness
## 31765            stable     positive
## 31766            stable        trust
## 31767               top anticipation
## 31768               top     positive
## 31769               top        trust
## 31770          planning anticipation
## 31771          planning     positive
## 31772          planning        trust
## 31773          worrying anticipation
## 31774          worrying         fear
## 31775          worrying     negative
## 31776          worrying      sadness
## 31777          collapse      disgust
## 31778          collapse         fear
## 31779          collapse     negative
## 31780          collapse      sadness
## 31781               don     positive
## 31782               don        trust
## 31783           fragile         fear
## 31784           fragile     negative
## 31785           fragile      sadness
## 31786           killing        anger
## 31787           killing         fear
## 31788           killing     negative
## 31789           killing      sadness
## 31790            brains     positive
## 31791             fight        anger
## 31792             fight         fear
## 31793             fight     negative
## 31794            expect anticipation
## 31795            expect     positive
## 31796            expect     surprise
## 31797            expect        trust
## 31798          humanity          joy
## 31799          humanity     positive
## 31800          humanity        trust
## 31801            suffer     negative
## 31802        conspiracy         fear
## 31803         believing     positive
## 31804         believing        trust
## 31805            stupid     negative
## 31806             guess     surprise
## 31807               eat     positive
## 31808               eat     positive
## 31809            change         fear
## 31810          disagree        anger
## 31811          disagree     negative
## 31812            pretty anticipation
## 31813            pretty          joy
## 31814            pretty     positive
## 31815            pretty        trust
## 31816          relevant     positive
## 31817          relevant        trust
## 31818             agree     positive
## 31819            change         fear
## 31820            offset anticipation
## 31821            offset     positive
## 31822            pretty anticipation
## 31823            pretty          joy
## 31824            pretty     positive
## 31825            pretty        trust
## 31826        contribute     positive
## 31827            change         fear
## 31828            crisis     negative
## 31829            cancer        anger
## 31830            cancer      disgust
## 31831            cancer         fear
## 31832            cancer     negative
## 31833            cancer      sadness
## 31834            cancer        anger
## 31835            cancer      disgust
## 31836            cancer         fear
## 31837            cancer     negative
## 31838            cancer      sadness
## 31839            cancer        anger
## 31840            cancer      disgust
## 31841            cancer         fear
## 31842            cancer     negative
## 31843            cancer      sadness
## 31844           prevent         fear
## 31845       information     positive
## 31846           logical     positive
## 31847            public anticipation
## 31848            public     positive
## 31849             argue        anger
## 31850             argue     negative
## 31851           freedom          joy
## 31852           freedom     positive
## 31853           freedom        trust
## 31854               ban     negative
## 31855              plan anticipation
## 31856            result anticipation
## 31857         unhealthy      disgust
## 31858         unhealthy         fear
## 31859         unhealthy     negative
## 31860         unhealthy      sadness
## 31861            public anticipation
## 31862            public     positive
## 31863       catastrophe        anger
## 31864       catastrophe      disgust
## 31865       catastrophe         fear
## 31866       catastrophe     negative
## 31867       catastrophe      sadness
## 31868       catastrophe     surprise
## 31869         illogical     negative
## 31870        government         fear
## 31871        government     negative
## 31872           failure      disgust
## 31873           failure         fear
## 31874           failure     negative
## 31875           failure      sadness
## 31876           account        trust
## 31877             argue        anger
## 31878             argue     negative
## 31879            unfair        anger
## 31880            unfair      disgust
## 31881            unfair     negative
## 31882            unfair      sadness
## 31883            change         fear
## 31884              fall     negative
## 31885              fall      sadness
## 31886             lower     negative
## 31887             lower      sadness
## 31888             agree     positive
## 31889        irrelevant     negative
## 31890            change         fear
## 31891             owing        anger
## 31892             owing anticipation
## 31893             owing      disgust
## 31894             owing         fear
## 31895             owing     negative
## 31896             owing      sadness
## 31897             owing        trust
## 31898             money        anger
## 31899             money anticipation
## 31900             money          joy
## 31901             money     positive
## 31902             money     surprise
## 31903             money        trust
## 31904              true          joy
## 31905              true     positive
## 31906              true        trust
## 31907           survive     positive
## 31908          powerful        anger
## 31909          powerful anticipation
## 31910          powerful      disgust
## 31911          powerful         fear
## 31912          powerful          joy
## 31913          powerful     positive
## 31914          powerful        trust
## 31915            retain        trust
## 31916           ability     positive
## 31917            change         fear
## 31918            crisis     negative
## 31919        unfairness        anger
## 31920        unfairness     negative
## 31921        unfairness      sadness
## 31922     justification     positive
## 31923              save          joy
## 31924              save     positive
## 31925              save        trust
## 31926             trick     negative
## 31927             trick     surprise
## 31928         indignant        anger
## 31929         indignant     negative
## 31930          inaction     negative
## 31931              fall     negative
## 31932              fall      sadness
## 31933              wait anticipation
## 31934              wait     negative
## 31935           equally     positive
## 31936             react        anger
## 31937             react         fear
## 31938              time anticipation
## 31939           finally anticipation
## 31940           finally      disgust
## 31941           finally          joy
## 31942           finally     positive
## 31943           finally     surprise
## 31944           finally        trust
## 31945            appeal anticipation
## 31946       sympathetic         fear
## 31947       sympathetic          joy
## 31948       sympathetic     positive
## 31949       sympathetic      sadness
## 31950       sympathetic        trust
## 31951             moral        anger
## 31952             moral     positive
## 31953             moral        trust
## 31954           remains      disgust
## 31955           remains         fear
## 31956           remains     negative
## 31957           remains     positive
## 31958           remains        trust
## 31959            result anticipation
## 31960           opposed        anger
## 31961           opposed         fear
## 31962           opposed     negative
## 31963          reticent         fear
## 31964          reticent     negative
## 31965              farm anticipation
## 31966       opportunity anticipation
## 31967       opportunity     positive
## 31968             enjoy anticipation
## 31969             enjoy          joy
## 31970             enjoy     positive
## 31971             enjoy        trust
## 31972           primary     positive
## 31973       agriculture     positive
## 31974            fairly     positive
## 31975            fairly        trust
## 31976            brutal        anger
## 31977            brutal         fear
## 31978            brutal     negative
## 31979       agriculture     positive
## 31980          ultimate anticipation
## 31981          ultimate      sadness
## 31982              loss        anger
## 31983              loss         fear
## 31984              loss     negative
## 31985              loss      sadness
## 31986             death        anger
## 31987             death anticipation
## 31988             death      disgust
## 31989             death         fear
## 31990             death     negative
## 31991             death      sadness
## 31992             death     surprise
## 31993              loss        anger
## 31994              loss         fear
## 31995              loss     negative
## 31996              loss      sadness
## 31997             death        anger
## 31998             death anticipation
## 31999             death      disgust
## 32000             death         fear
## 32001             death     negative
## 32002             death      sadness
## 32003             death     surprise
## 32004             argue        anger
## 32005             argue     negative
## 32006            accord     positive
## 32007            accord        trust
## 32008            murder        anger
## 32009            murder      disgust
## 32010            murder         fear
## 32011            murder     negative
## 32012            murder      sadness
## 32013            murder     surprise
## 32014              time anticipation
## 32015          continue anticipation
## 32016          continue     positive
## 32017          continue        trust
## 32018              food          joy
## 32019              food     positive
## 32020              food        trust
## 32021              plan anticipation
## 32022         concerned         fear
## 32023         concerned      sadness
## 32024             argue        anger
## 32025             argue     negative
## 32026         concerned         fear
## 32027         concerned      sadness
## 32028        ultimately anticipation
## 32029        ultimately     positive
## 32030          preserve     positive
## 32031            status     positive
## 32032        disservice        anger
## 32033        disservice      disgust
## 32034        disservice     negative
## 32035        disservice      sadness
## 32036           killing        anger
## 32037           killing         fear
## 32038           killing     negative
## 32039           killing      sadness
## 32040          argument        anger
## 32041          argument     negative
## 32042           include     positive
## 32043       agriculture     positive
## 32044           killing        anger
## 32045           killing         fear
## 32046           killing     negative
## 32047           killing      sadness
## 32048               bad        anger
## 32049               bad      disgust
## 32050               bad         fear
## 32051               bad     negative
## 32052               bad      sadness
## 32053         arguments        anger
## 32054          disagree        anger
## 32055          disagree     negative
## 32056         expertise     positive
## 32057         expertise        trust
## 32058       agriculture     positive
## 32059            oppose     negative
## 32060         arguments        anger
## 32061            absent     negative
## 32062            absent      sadness
## 32063         arguments        anger
## 32064            public anticipation
## 32065            public     positive
## 32066              kill         fear
## 32067              kill     negative
## 32068              kill      sadness
## 32069               top anticipation
## 32070               top     positive
## 32071               top        trust
## 32072            reason     positive
## 32073          surprise         fear
## 32074          surprise          joy
## 32075          surprise     positive
## 32076          surprise     surprise
## 32077            change         fear
## 32078            change         fear
## 32079            punish         fear
## 32080            punish     negative
## 32081              kill         fear
## 32082              kill     negative
## 32083              kill      sadness
## 32084              crap      disgust
## 32085              crap     negative
## 32086          continue anticipation
## 32087          continue     positive
## 32088          continue        trust
## 32089         suffering      disgust
## 32090         suffering         fear
## 32091         suffering     negative
## 32092         suffering      sadness
## 32093          innocent     positive
## 32094          innocent        trust
## 32095               top anticipation
## 32096               top     positive
## 32097               top        trust
## 32098       responsible     positive
## 32099       responsible        trust
## 32100            actual     positive
## 32101           measure        trust
## 32102       intelligent     positive
## 32103       intelligent        trust
## 32104           lacking     negative
## 32105             blame        anger
## 32106             blame      disgust
## 32107             blame     negative
## 32108             start anticipation
## 32109            change         fear
## 32110             title     positive
## 32111             title        trust
## 32112           madness        anger
## 32113           madness         fear
## 32114           madness     negative
## 32115          military         fear
## 32116          military         fear
## 32117            public anticipation
## 32118            public     positive
## 32119        resistance        anger
## 32120        resistance     negative
## 32121         influence     negative
## 32122         influence     positive
## 32123          favorite          joy
## 32124          favorite     positive
## 32125          favorite        trust
## 32126         concerned         fear
## 32127         concerned      sadness
## 32128            actual     positive
## 32129       information     positive
## 32130        propaganda     negative
## 32131               eat     positive
## 32132             cheap     negative
## 32133              hope anticipation
## 32134              hope          joy
## 32135              hope     positive
## 32136              hope     surprise
## 32137              hope        trust
## 32138              cube        trust
## 32139            happen anticipation
## 32140       possibility anticipation
## 32141              shit        anger
## 32142              shit      disgust
## 32143              shit     negative
## 32144         stupidity     negative
## 32145            sudden     surprise
## 32146              loss        anger
## 32147              loss         fear
## 32148              loss     negative
## 32149              loss      sadness
## 32150            supply     positive
## 32151             start anticipation
## 32152            suffer     negative
## 32153            afford     positive
## 32154          increase     positive
## 32155         happiness anticipation
## 32156         happiness          joy
## 32157         happiness     positive
## 32158           partner     positive
## 32159            pretty anticipation
## 32160            pretty          joy
## 32161            pretty     positive
## 32162            pretty        trust
## 32163              shit        anger
## 32164              shit      disgust
## 32165              shit     negative
## 32166             wrong     negative
## 32167              food          joy
## 32168              food     positive
## 32169              food        trust
## 32170          shortage        anger
## 32171          shortage         fear
## 32172          shortage     negative
## 32173          shortage      sadness
## 32174             cheap     negative
## 32175               eat     positive
## 32176              kill         fear
## 32177              kill     negative
## 32178              kill      sadness
## 32179          solution     positive
## 32180            change         fear
## 32181            effort     positive
## 32182             cheap     negative
## 32183            famine     negative
## 32184            famine      sadness
## 32185            change         fear
## 32186               eat     positive
## 32187             start anticipation
## 32188             green          joy
## 32189             green     positive
## 32190             green        trust
## 32191              deal anticipation
## 32192              deal          joy
## 32193              deal     positive
## 32194              deal     surprise
## 32195              deal        trust
## 32196              save          joy
## 32197              save     positive
## 32198              save        trust
## 32199              wait anticipation
## 32200              wait     negative
## 32201              kill         fear
## 32202              kill     negative
## 32203              kill      sadness
## 32204             extra     positive
## 32205         slaughter        anger
## 32206         slaughter      disgust
## 32207         slaughter         fear
## 32208         slaughter     negative
## 32209         slaughter      sadness
## 32210         slaughter     surprise
## 32211         volunteer anticipation
## 32212         volunteer         fear
## 32213         volunteer          joy
## 32214         volunteer     positive
## 32215         volunteer        trust
## 32216               eat     positive
## 32217            chance     surprise
## 32218          practice     positive
## 32219          mountain anticipation
## 32220     comprehensive     positive
## 32221         arguments        anger
## 32222     controversial        anger
## 32223     controversial     negative
## 32224         holocaust        anger
## 32225         holocaust      disgust
## 32226         holocaust         fear
## 32227         holocaust     negative
## 32228         holocaust      sadness
## 32229         holocaust        anger
## 32230         holocaust      disgust
## 32231         holocaust         fear
## 32232         holocaust     negative
## 32233         holocaust      sadness
## 32234            denial     negative
## 32235         holocaust        anger
## 32236         holocaust      disgust
## 32237         holocaust         fear
## 32238         holocaust     negative
## 32239         holocaust      sadness
## 32240            denial     negative
## 32241              talk     positive
## 32242          fortress         fear
## 32243          fortress     positive
## 32244          fortress      sadness
## 32245          fortress        trust
## 32246             dumps        anger
## 32247             dumps     negative
## 32248             dumps      sadness
## 32249            growth     positive
## 32250               rob        anger
## 32251               rob      disgust
## 32252               rob         fear
## 32253               rob     negative
## 32254               rob      sadness
## 32255           content          joy
## 32256           content     positive
## 32257           content        trust
## 32258          academic     positive
## 32259          academic        trust
## 32260        completely     positive
## 32261              safe          joy
## 32262              safe     positive
## 32263              safe        trust
## 32264           opposed        anger
## 32265           opposed         fear
## 32266           opposed     negative
## 32267              kick        anger
## 32268              kick     negative
## 32269            change         fear
## 32270            debate     positive
## 32271              hype anticipation
## 32272              hype     negative
## 32273              flow     positive
## 32274              cool     positive
## 32275           vaccine     positive
## 32276         difficult         fear
## 32277         certainty     positive
## 32278            change         fear
## 32279          rigorous     negative
## 32280            theory anticipation
## 32281            theory        trust
## 32282         difficult         fear
## 32283       reliability     positive
## 32284       reliability        trust
## 32285          weakness     negative
## 32286            change         fear
## 32287      disagreement        anger
## 32288      disagreement     negative
## 32289      disagreement      sadness
## 32290          annoying        anger
## 32291          annoying     negative
## 32292         difficult         fear
## 32293            policy        trust
## 32294          question     positive
## 32295            change         fear
## 32296        government         fear
## 32297        government     negative
## 32298          vacation anticipation
## 32299          vacation          joy
## 32300          vacation     positive
## 32301               sea     positive
## 32302             level     positive
## 32303             level        trust
## 32304            rising anticipation
## 32305            rising          joy
## 32306            rising     positive
## 32307            actual     positive
## 32308          calamity      sadness
## 32309             naive     negative
## 32310              wait anticipation
## 32311              wait     negative
## 32312       catastrophe        anger
## 32313       catastrophe      disgust
## 32314       catastrophe         fear
## 32315       catastrophe     negative
## 32316       catastrophe      sadness
## 32317       catastrophe     surprise
## 32318           attempt anticipation
## 32319         injection         fear
## 32320            threat        anger
## 32321            threat         fear
## 32322            threat     negative
## 32323       termination     negative
## 32324       termination      sadness
## 32325             shock        anger
## 32326             shock         fear
## 32327             shock     negative
## 32328             shock     surprise
## 32329          humanity          joy
## 32330          humanity     positive
## 32331          humanity        trust
## 32332              time anticipation
## 32333          solution     positive
## 32334         passenger anticipation
## 32335             cheap     negative
## 32336          solution     positive
## 32337              hope anticipation
## 32338              hope          joy
## 32339              hope     positive
## 32340              hope     surprise
## 32341              hope        trust
## 32342       catastrophe        anger
## 32343       catastrophe      disgust
## 32344       catastrophe         fear
## 32345       catastrophe     negative
## 32346       catastrophe      sadness
## 32347       catastrophe     surprise
## 32348            public anticipation
## 32349            public     positive
## 32350       termination     negative
## 32351       termination      sadness
## 32352             shock        anger
## 32353             shock         fear
## 32354             shock     negative
## 32355             shock     surprise
## 32356         confident          joy
## 32357         confident     positive
## 32358         confident        trust
## 32359          humanity          joy
## 32360          humanity     positive
## 32361          humanity        trust
## 32362       cooperative     positive
## 32363       cooperative        trust
## 32364            effort     positive
## 32365       termination     negative
## 32366       termination      sadness
## 32367             shock        anger
## 32368             shock         fear
## 32369             shock     negative
## 32370             shock     surprise
## 32371              cool     positive
## 32372             break     surprise
## 32373            pretty anticipation
## 32374            pretty          joy
## 32375            pretty     positive
## 32376            pretty        trust
## 32377               hit        anger
## 32378               hit     negative
## 32379            offset anticipation
## 32380            offset     positive
## 32381          increase     positive
## 32382            steady     surprise
## 32383            steady        trust
## 32384             break     surprise
## 32385              lose        anger
## 32386              lose      disgust
## 32387              lose         fear
## 32388              lose     negative
## 32389              lose      sadness
## 32390              lose     surprise
## 32391          building     positive
## 32392            rising anticipation
## 32393            rising          joy
## 32394            rising     positive
## 32395             avoid         fear
## 32396             avoid     negative
## 32397         confident          joy
## 32398         confident     positive
## 32399         confident        trust
## 32400             count     positive
## 32401             count        trust
## 32402         guarantee     positive
## 32403         guarantee        trust
## 32404         confident          joy
## 32405         confident     positive
## 32406         confident        trust
## 32407             count     positive
## 32408             count        trust
## 32409              plan anticipation
## 32410             cheap     negative
## 32411       termination     negative
## 32412       termination      sadness
## 32413             shock        anger
## 32414             shock         fear
## 32415             shock     negative
## 32416             shock     surprise
## 32417         confident          joy
## 32418         confident     positive
## 32419         confident        trust
## 32420          humanity          joy
## 32421          humanity     positive
## 32422          humanity        trust
## 32423       cooperative     positive
## 32424       cooperative        trust
## 32425            effort     positive
## 32426            benign          joy
## 32427            benign     positive
## 32428        technology     positive
## 32429             doubt         fear
## 32430             doubt     negative
## 32431             doubt      sadness
## 32432             doubt        trust
## 32433          momentum anticipation
## 32434          momentum     positive
## 32435             cheap     negative
## 32436              time anticipation
## 32437               sky     positive
## 32438              real     positive
## 32439              real        trust
## 32440              shit        anger
## 32441              shit      disgust
## 32442              shit     negative
## 32443            choice     positive
## 32444              fuss        anger
## 32445              fuss     negative
## 32446              fuss      sadness
## 32447         attention     positive
## 32448     inappropriate        anger
## 32449     inappropriate      disgust
## 32450     inappropriate     negative
## 32451     inappropriate      sadness
## 32452            giving     positive
## 32453             prime     positive
## 32454            actual     positive
## 32455        corruption      disgust
## 32456        corruption     negative
## 32457            pretty anticipation
## 32458            pretty          joy
## 32459            pretty     positive
## 32460            pretty        trust
## 32461             worse         fear
## 32462             worse     negative
## 32463             worse      sadness
## 32464            policy        trust
## 32465               bad        anger
## 32466               bad      disgust
## 32467               bad         fear
## 32468               bad     negative
## 32469               bad      sadness
## 32470               bad        anger
## 32471               bad      disgust
## 32472               bad         fear
## 32473               bad     negative
## 32474               bad      sadness
## 32475           warning         fear
## 32476              gang        anger
## 32477              gang         fear
## 32478              gang     negative
## 32479              baby          joy
## 32480              baby     positive
## 32481            change         fear
## 32482              real     positive
## 32483              real        trust
## 32484              risk anticipation
## 32485              risk         fear
## 32486              risk     negative
## 32487            change         fear
## 32488              real     positive
## 32489              real        trust
## 32490              risk anticipation
## 32491              risk         fear
## 32492              risk     negative
## 32493             lying        anger
## 32494             lying      disgust
## 32495             lying     negative
## 32496            change         fear
## 32497              real     positive
## 32498              real        trust
## 32499              risk anticipation
## 32500              risk         fear
## 32501              risk     negative
## 32502              cold     negative
## 32503            change         fear
## 32504              real     positive
## 32505              real        trust
## 32506              risk anticipation
## 32507              risk         fear
## 32508              risk     negative
## 32509              real     positive
## 32510              real        trust
## 32511            change         fear
## 32512              real     positive
## 32513              real        trust
## 32514              risk anticipation
## 32515              risk         fear
## 32516              risk     negative
## 32517            change         fear
## 32518              real     positive
## 32519              real        trust
## 32520              kill         fear
## 32521              kill     negative
## 32522              kill      sadness
## 32523            fellow     positive
## 32524            fellow        trust
## 32525            change         fear
## 32526            wealth          joy
## 32527            wealth     positive
## 32528            wealth        trust
## 32529            refuse     negative
## 32530            change         fear
## 32531          argument        anger
## 32532          argument     negative
## 32533         necessity      sadness
## 32534         backwards      disgust
## 32535         backwards     negative
## 32536            change         fear
## 32537              real     positive
## 32538              real        trust
## 32539            honest        anger
## 32540            honest      disgust
## 32541            honest         fear
## 32542            honest          joy
## 32543            honest     positive
## 32544            honest      sadness
## 32545            honest        trust
## 32546            change         fear
## 32547            change         fear
## 32548              true          joy
## 32549              true     positive
## 32550              true        trust
## 32551          fighting        anger
## 32552          fighting     negative
## 32553              evil        anger
## 32554              evil      disgust
## 32555              evil         fear
## 32556              evil     negative
## 32557              evil      sadness
## 32558        conspiracy         fear
## 32559            change         fear
## 32560          randomly     surprise
## 32561            change         fear
## 32562            happen anticipation
## 32563         attacking        anger
## 32564         attacking      disgust
## 32565         attacking         fear
## 32566         attacking     negative
## 32567         attacking      sadness
## 32568         attacking     surprise
## 32569         dangerous         fear
## 32570         dangerous     negative
## 32571            change         fear
## 32572              real     positive
## 32573              real        trust
## 32574           rejects        anger
## 32575           rejects         fear
## 32576           rejects     negative
## 32577           rejects      sadness
## 32578        outlandish     negative
## 32579       detrimental     negative
## 32580         skeptical     negative
## 32581         authority     positive
## 32582         authority        trust
## 32583         devastate        anger
## 32584         devastate         fear
## 32585         devastate     negative
## 32586         devastate      sadness
## 32587              kill         fear
## 32588              kill     negative
## 32589              kill      sadness
## 32590         emergency         fear
## 32591         emergency     negative
## 32592         emergency      sadness
## 32593         emergency     surprise
## 32594        contribute     positive
## 32595         structure     positive
## 32596         structure        trust
## 32597            speech     positive
## 32598           opposed        anger
## 32599           opposed         fear
## 32600           opposed     negative
## 32601             avoid         fear
## 32602             avoid     negative
## 32603        concluding     positive
## 32604           engaged anticipation
## 32605           engaged          joy
## 32606           engaged     positive
## 32607           engaged        trust
## 32608        discussion     positive
## 32609           subject     negative
## 32610         substance     positive
## 32611             argue        anger
## 32612             argue     negative
## 32613        opposition        anger
## 32614        opposition     negative
## 32615            action     positive
## 32616            change         fear
## 32617            change         fear
## 32618              real     positive
## 32619              real        trust
## 32620           predict anticipation
## 32621              time anticipation
## 32622         including     positive
## 32623            change         fear
## 32624            actual     positive
## 32625         committed     positive
## 32626         committed        trust
## 32627            change         fear
## 32628             agree     positive
## 32629          solution     positive
## 32630            actual     positive
## 32631             model     positive
## 32632         arguments        anger
## 32633             agree     positive
## 32634             agree     positive
## 32635             share anticipation
## 32636             share          joy
## 32637             share     positive
## 32638             share        trust
## 32639      disagreement        anger
## 32640      disagreement     negative
## 32641      disagreement      sadness
## 32642             agree     positive
## 32643            actual     positive
## 32644           darling          joy
## 32645           darling     positive
## 32646           darling        trust
## 32647            change         fear
## 32648       contentious        anger
## 32649       contentious      disgust
## 32650       contentious         fear
## 32651       contentious     negative
## 32652             trust        trust
## 32653             trust        trust
## 32654             trust        trust
## 32655            change         fear
## 32656            change         fear
## 32657       consistency     positive
## 32658       consistency        trust
## 32659           achieve          joy
## 32660           achieve     positive
## 32661           achieve        trust
## 32662        irrelevant     negative
## 32663          question     positive
## 32664          childish     negative
## 32665        paraphrase     negative
## 32666        paraphrase     positive
## 32667             model     positive
## 32668         concerned         fear
## 32669         concerned      sadness
## 32670             agree     positive
## 32671         objection        anger
## 32672         objection     negative
## 32673            change         fear
## 32674              true          joy
## 32675              true     positive
## 32676              true        trust
## 32677        strengthen     positive
## 32678        capitalist     positive
## 32679             serve     negative
## 32680             serve        trust
## 32681         objective anticipation
## 32682         objective     positive
## 32683         objective        trust
## 32684            change         fear
## 32685             serve     negative
## 32686             serve        trust
## 32687         objective anticipation
## 32688         objective     positive
## 32689         objective        trust
## 32690           explain     positive
## 32691           explain        trust
## 32692             truth     positive
## 32693             truth        trust
## 32694        outlandish     negative
## 32695             virus     negative
## 32696        outlandish     negative
## 32697           prepare anticipation
## 32698           prepare     positive
## 32699            change         fear
## 32700          increase     positive
## 32701           violent        anger
## 32702           violent      disgust
## 32703           violent         fear
## 32704           violent     negative
## 32705           violent     surprise
## 32706             bound     negative
## 32707        outlandish     negative
## 32708       probability anticipation
## 32709             fixed        trust
## 32710            happen anticipation
## 32711            sudden     surprise
## 32712      collectively     positive
## 32713      collectively        trust
## 32714       probability anticipation
## 32715      difficulties     negative
## 32716      difficulties      sadness
## 32717          cautious anticipation
## 32718          cautious         fear
## 32719          cautious     positive
## 32720          cautious        trust
## 32721            degree     positive
## 32722        confidence         fear
## 32723        confidence          joy
## 32724        confidence     positive
## 32725        confidence        trust
## 32726           predict anticipation
## 32727         encourage          joy
## 32728         encourage     positive
## 32729         encourage        trust
## 32730             start anticipation
## 32731             dying        anger
## 32732             dying      disgust
## 32733             dying         fear
## 32734             dying     negative
## 32735             dying      sadness
## 32736          disaster        anger
## 32737          disaster      disgust
## 32738          disaster         fear
## 32739          disaster     negative
## 32740          disaster      sadness
## 32741          disaster     surprise
## 32742              real     positive
## 32743              real        trust
## 32744          disaster        anger
## 32745          disaster      disgust
## 32746          disaster         fear
## 32747          disaster     negative
## 32748          disaster      sadness
## 32749          disaster     surprise
## 32750              grab        anger
## 32751              grab     negative
## 32752       exaggerated     negative
## 32753             worry anticipation
## 32754             worry         fear
## 32755             worry     negative
## 32756             worry      sadness
## 32757            change         fear
## 32758              deal anticipation
## 32759              deal          joy
## 32760              deal     positive
## 32761              deal     surprise
## 32762              deal        trust
## 32763          disagree        anger
## 32764          disagree     negative
## 32765       responsible     positive
## 32766       responsible        trust
## 32767         suffering      disgust
## 32768         suffering         fear
## 32769         suffering     negative
## 32770         suffering      sadness
## 32771               ass     negative
## 32772            change         fear
## 32773              real     positive
## 32774              real        trust
## 32775              true          joy
## 32776              true     positive
## 32777              true        trust
## 32778            change         fear
## 32779          humanity          joy
## 32780          humanity     positive
## 32781          humanity        trust
## 32782               cry     negative
## 32783               cry      sadness
## 32784       credibility     positive
## 32785       credibility        trust
## 32786            actual     positive
## 32787        remarkably     positive
## 32788          accurate     positive
## 32789          accurate        trust
## 32790            tragic     negative
## 32791            change         fear
## 32792             board anticipation
## 32793             green          joy
## 32794             green     positive
## 32795             green        trust
## 32796            policy        trust
## 32797             faith anticipation
## 32798             faith          joy
## 32799             faith     positive
## 32800             faith        trust
## 32801               art anticipation
## 32802               art          joy
## 32803               art     positive
## 32804               art      sadness
## 32805               art     surprise
## 32806       catastrophe        anger
## 32807       catastrophe      disgust
## 32808       catastrophe         fear
## 32809       catastrophe     negative
## 32810       catastrophe      sadness
## 32811       catastrophe     surprise
## 32812       communicate     positive
## 32813       communicate        trust
## 32814              lack     negative
## 32815            change         fear
## 32816          humanity          joy
## 32817          humanity     positive
## 32818          humanity        trust
## 32819          accurate     positive
## 32820          accurate        trust
## 32821         statement     positive
## 32822         statement        trust
## 32823            change         fear
## 32824             quote anticipation
## 32825             quote     negative
## 32826             quote     positive
## 32827             quote     surprise
## 32828           vaccine     positive
## 32829            cancer        anger
## 32830            cancer      disgust
## 32831            cancer         fear
## 32832            cancer     negative
## 32833            cancer      sadness
## 32834          perceive     positive
## 32835          perceive        trust
## 32836               bad        anger
## 32837               bad      disgust
## 32838               bad         fear
## 32839               bad     negative
## 32840               bad      sadness
## 32841            change         fear
## 32842           hearing         fear
## 32843           hearing     negative
## 32844             sense     positive
## 32845            action     positive
## 32846         distorted      disgust
## 32847         distorted     negative
## 32848 misrepresentation     negative
## 32849 misrepresentation      sadness
## 32850           suggest        trust
## 32851             wrong     negative
## 32852             quote anticipation
## 32853             quote     negative
## 32854             quote     positive
## 32855             quote     surprise
## 32856          famously     positive
## 32857              main     positive
## 32858          solution     positive
## 32859             child anticipation
## 32860             child          joy
## 32861             child     positive
## 32862               lie        anger
## 32863               lie      disgust
## 32864               lie     negative
## 32865               lie      sadness
## 32866         dangerous         fear
## 32867         dangerous     negative
## 32868               lie        anger
## 32869               lie      disgust
## 32870               lie     negative
## 32871               lie      sadness
## 32872           prevent         fear
## 32873            degree     positive
## 32874             avoid         fear
## 32875             avoid     negative
## 32876      civilization     positive
## 32877      civilization        trust
## 32878            speech     positive
## 32879        transcript        trust
## 32880            speech     positive
## 32881            action     positive
## 32882           cutting        anger
## 32883           cutting      disgust
## 32884           cutting         fear
## 32885           cutting     negative
## 32886           cutting      sadness
## 32887            chance     surprise
## 32888              risk anticipation
## 32889              risk         fear
## 32890              risk     negative
## 32891        acceptable     positive
## 32892           include     positive
## 32893            hidden     negative
## 32894             toxic      disgust
## 32895             toxic     negative
## 32896         pollution      disgust
## 32897         pollution     negative
## 32898            equity     positive
## 32899           justice     positive
## 32900           justice        trust
## 32901              risk anticipation
## 32902              risk         fear
## 32903              risk     negative
## 32904        acceptable     positive
## 32905            chance     surprise
## 32906            change         fear
## 32907              dare anticipation
## 32908              dare        trust
## 32909           pretend     negative
## 32910             usual     positive
## 32911             usual        trust
## 32912            budget        trust
## 32913               hit        anger
## 32914               hit     negative
## 32915         concerned         fear
## 32916         concerned      sadness
## 32917            chance     surprise
## 32918             worse         fear
## 32919             worse     negative
## 32920             worse      sadness
## 32921            reason     positive
## 32922           urgency anticipation
## 32923           urgency         fear
## 32924           urgency     surprise
## 32925            chance     surprise
## 32926        depressing      disgust
## 32927        depressing     negative
## 32928        depressing      sadness
## 32929    uncontrollable        anger
## 32930    uncontrollable anticipation
## 32931    uncontrollable     negative
## 32932    uncontrollable     surprise
## 32933               hit        anger
## 32934               hit     negative
## 32935       seriousness         fear
## 32936       seriousness      sadness
## 32937               bad        anger
## 32938               bad      disgust
## 32939               bad         fear
## 32940               bad     negative
## 32941               bad      sadness
## 32942            change         fear
## 32943        completely     positive
## 32944              risk anticipation
## 32945              risk         fear
## 32946              risk     negative
## 32947            degree     positive
## 32948             dying        anger
## 32949             dying      disgust
## 32950             dying         fear
## 32951             dying     negative
## 32952             dying      sadness
## 32953               bad        anger
## 32954               bad      disgust
## 32955               bad         fear
## 32956               bad     negative
## 32957               bad      sadness
## 32958               job     positive
## 32959         illogical     negative
## 32960            modify     surprise
## 32961            player     negative
## 32962            change         fear
## 32963            modify     surprise
## 32964            player     negative
## 32965              real     positive
## 32966              real        trust
## 32967         statement     positive
## 32968         statement        trust
## 32969            actual     positive
## 32970            excuse     negative
## 32971            change         fear
## 32972         statement     positive
## 32973         statement        trust
## 32974            tackle        anger
## 32975            tackle     surprise
## 32976            change         fear
## 32977            player     negative
## 32978              rest     positive
## 32979        population     positive
## 32980             chart        trust
## 32981              food          joy
## 32982              food     positive
## 32983              food        trust
## 32984         pollution      disgust
## 32985         pollution     negative
## 32986         pollution      disgust
## 32987         pollution     negative
## 32988          argument        anger
## 32989          argument     negative
## 32990               don     positive
## 32991               don        trust
## 32992            change         fear
## 32993             start anticipation
## 32994             start anticipation
## 32995             start anticipation
## 32996             start anticipation
## 32997             start anticipation
## 32998              real     positive
## 32999              real        trust
## 33000            reason     positive
## 33001              fake     negative
## 33002            reason     positive
## 33003            actual     positive
## 33004             blame        anger
## 33005             blame      disgust
## 33006             blame     negative
## 33007             agree     positive
## 33008             money        anger
## 33009             money anticipation
## 33010             money          joy
## 33011             money     positive
## 33012             money     surprise
## 33013             money        trust
## 33014           network anticipation
## 33015             level     positive
## 33016             level        trust
## 33017             clean          joy
## 33018             clean     positive
## 33019             clean        trust
## 33020          solution     positive
## 33021           subject     negative
## 33022            excuse     negative
## 33023            actual     positive
## 33024             level     positive
## 33025             level        trust
## 33026            action     positive
## 33027            change         fear
## 33028            change         fear
## 33029            larger      disgust
## 33030            larger     surprise
## 33031            larger        trust
## 33032        production anticipation
## 33033        production     positive
## 33034            growth     positive
## 33035       responsible     positive
## 33036       responsible        trust
## 33037          increase     positive
## 33038            absurd     negative
## 33039           battery        anger
## 33040           battery     negative
## 33041        technology     positive
## 33042         producing     positive
## 33043              shit        anger
## 33044              shit      disgust
## 33045              shit     negative
## 33046           pollute      disgust
## 33047           pollute     negative
## 33048            change         fear
## 33049          humanity          joy
## 33050          humanity     positive
## 33051          humanity        trust
## 33052             bitch        anger
## 33053             bitch      disgust
## 33054             bitch         fear
## 33055             bitch     negative
## 33056             bitch      sadness
## 33057              shit        anger
## 33058              shit      disgust
## 33059              shit     negative
## 33060         producing     positive
## 33061              shit        anger
## 33062              shit      disgust
## 33063              shit     negative
## 33064              shit        anger
## 33065              shit      disgust
## 33066              shit     negative
## 33067             start anticipation
## 33068         dishonest        anger
## 33069         dishonest      disgust
## 33070         dishonest     negative
## 33071         dishonest      sadness
## 33072          forgiven     positive
## 33073             level     positive
## 33074             level        trust
## 33075     understanding     positive
## 33076     understanding        trust
## 33077            reason     positive
## 33078           pollute      disgust
## 33079           pollute     negative
## 33080           network anticipation
## 33081            create          joy
## 33082            create     positive
## 33083       electricity     positive
## 33084         dishonest        anger
## 33085         dishonest      disgust
## 33086         dishonest     negative
## 33087         dishonest      sadness
## 33088          forgiven     positive
## 33089             level     positive
## 33090             level        trust
## 33091     understanding     positive
## 33092     understanding        trust
## 33093            stupid     negative
## 33094              shit        anger
## 33095              shit      disgust
## 33096              shit     negative
## 33097             sense     positive
## 33098          absolute     positive
## 33099             green          joy
## 33100             green     positive
## 33101             green        trust
## 33102            reason     positive
## 33103           pollute      disgust
## 33104           pollute     negative
## 33105       agriculture     positive
## 33106             extra     positive
## 33107               sea     positive
## 33108            rising anticipation
## 33109            rising          joy
## 33110            rising     positive
## 33111          argument        anger
## 33112          argument     negative
## 33113             lines         fear
## 33114            change         fear
## 33115               bad        anger
## 33116               bad      disgust
## 33117               bad         fear
## 33118               bad     negative
## 33119               bad      sadness
## 33120               bad        anger
## 33121               bad      disgust
## 33122               bad         fear
## 33123               bad     negative
## 33124               bad      sadness
## 33125           foreign     negative
## 33126         adversary        anger
## 33127         adversary     negative
## 33128             fault     negative
## 33129             fault      sadness
## 33130          ignorant      disgust
## 33131          ignorant     negative
## 33132        suspicious        anger
## 33133        suspicious anticipation
## 33134        suspicious     negative
## 33135             green          joy
## 33136             green     positive
## 33137             green        trust
## 33138            policy        trust
## 33139              real     positive
## 33140              real        trust
## 33141        suspicious        anger
## 33142        suspicious anticipation
## 33143        suspicious     negative
## 33144           prevent         fear
## 33145            change         fear
## 33146           damages     negative
## 33147           damages      sadness
## 33148         incorrect     negative
## 33149             money        anger
## 33150             money anticipation
## 33151             money          joy
## 33152             money     positive
## 33153             money     surprise
## 33154             money        trust
## 33155             money        anger
## 33156             money anticipation
## 33157             money          joy
## 33158             money     positive
## 33159             money     surprise
## 33160             money        trust
## 33161            reason     positive
## 33162             money        anger
## 33163             money anticipation
## 33164             money          joy
## 33165             money     positive
## 33166             money     surprise
## 33167             money        trust
## 33168            policy        trust
## 33169            change         fear
## 33170           benefit     positive
## 33171            policy        trust
## 33172        charitable anticipation
## 33173        charitable          joy
## 33174        charitable     positive
## 33175        charitable        trust
## 33176            pretty anticipation
## 33177            pretty          joy
## 33178            pretty     positive
## 33179            pretty        trust
## 33180            actual     positive
## 33181          argument        anger
## 33182          argument     negative
## 33183             worse         fear
## 33184             worse     negative
## 33185             worse      sadness
## 33186              hate        anger
## 33187              hate      disgust
## 33188              hate         fear
## 33189              hate     negative
## 33190              hate      sadness
## 33191            stupid     negative
## 33192              tree        anger
## 33193              tree anticipation
## 33194              tree      disgust
## 33195              tree          joy
## 33196              tree     positive
## 33197              tree     surprise
## 33198              tree        trust
## 33199            wealth          joy
## 33200            wealth     positive
## 33201            wealth        trust
## 33202            wealth          joy
## 33203            wealth     positive
## 33204            wealth        trust
## 33205             trump     surprise
## 33206        supporting     positive
## 33207        supporting        trust
## 33208             trump     surprise
## 33209            change         fear
## 33210              hoax        anger
## 33211              hoax      disgust
## 33212              hoax     negative
## 33213              hoax      sadness
## 33214              hoax     surprise
## 33215            change         fear
## 33216          question     positive
## 33217         agreement     positive
## 33218         agreement        trust
## 33219               pay anticipation
## 33220               pay          joy
## 33221               pay     positive
## 33222               pay        trust
## 33223              shit        anger
## 33224              shit      disgust
## 33225              shit     negative
## 33226          disagree        anger
## 33227          disagree     negative
## 33228        pretending        anger
## 33229        pretending     negative
## 33230            wealth          joy
## 33231            wealth     positive
## 33232            wealth        trust
## 33233           refusal     negative
## 33234          personal        trust
## 33235            danger         fear
## 33236            danger     negative
## 33237            danger      sadness
## 33238               fun anticipation
## 33239               fun          joy
## 33240               fun     positive
## 33241              hoax        anger
## 33242              hoax      disgust
## 33243              hoax     negative
## 33244              hoax      sadness
## 33245              hoax     surprise
## 33246            change         fear
## 33247           forward     positive
## 33248        production anticipation
## 33249        production     positive
## 33250             lower     negative
## 33251             lower      sadness
## 33252        government         fear
## 33253        government     negative
## 33254             avoid         fear
## 33255             avoid     negative
## 33256        government         fear
## 33257        government     negative
## 33258         detriment     negative
## 33259             major     positive
## 33260            murder        anger
## 33261            murder      disgust
## 33262            murder         fear
## 33263            murder     negative
## 33264            murder      sadness
## 33265            murder     surprise
## 33266           economy        trust
## 33267        production anticipation
## 33268        production     positive
## 33269              joke     negative
## 33270            decent     positive
## 33271     communication        trust
## 33272     communication        trust
## 33273             awful        anger
## 33274             awful      disgust
## 33275             awful         fear
## 33276             awful     negative
## 33277             awful      sadness
## 33278          terrible        anger
## 33279          terrible      disgust
## 33280          terrible         fear
## 33281          terrible     negative
## 33282          terrible      sadness
## 33283         believing     positive
## 33284         believing        trust
## 33285             worth     positive
## 33286           evident     positive
## 33287           evident        trust
## 33288            public anticipation
## 33289            public     positive
## 33290            public anticipation
## 33291            public     positive
## 33292            degree     positive
## 33293            agreed     positive
## 33294            agreed        trust
## 33295           content          joy
## 33296           content     positive
## 33297           content        trust
## 33298               bad        anger
## 33299               bad      disgust
## 33300               bad         fear
## 33301               bad     negative
## 33302               bad      sadness
## 33303           subject     negative
## 33304             visit     positive
## 33305               sea     positive
## 33306            rising anticipation
## 33307            rising          joy
## 33308            rising     positive
## 33309               sea     positive
## 33310             level     positive
## 33311             level        trust
## 33312         childhood          joy
## 33313         childhood     positive
## 33314               sea     positive
## 33315             level     positive
## 33316             level        trust
## 33317            pretty anticipation
## 33318            pretty          joy
## 33319            pretty     positive
## 33320            pretty        trust
## 33321            expect anticipation
## 33322            expect     positive
## 33323            expect     surprise
## 33324            expect        trust
## 33325           erosion     negative
## 33326         hurricane         fear
## 33327         hurricane     negative
## 33328          strength     positive
## 33329          strength        trust
## 33330              land     positive
## 33331            coming anticipation
## 33332            pretty anticipation
## 33333            pretty          joy
## 33334            pretty     positive
## 33335            pretty        trust
## 33336             wrong     negative
## 33337               sea     positive
## 33338             level     positive
## 33339             level        trust
## 33340            rising anticipation
## 33341            rising          joy
## 33342            rising     positive
## 33343             coast     positive
## 33344            change         fear
## 33345           hearing         fear
## 33346           hearing     negative
## 33347        scientific     positive
## 33348        scientific        trust
## 33349             wrong     negative
## 33350               bad        anger
## 33351               bad      disgust
## 33352               bad         fear
## 33353               bad     negative
## 33354               bad      sadness
## 33355        prediction anticipation
## 33356             wrong     negative
## 33357              word     positive
## 33358              word        trust
## 33359               god anticipation
## 33360               god         fear
## 33361               god          joy
## 33362               god     positive
## 33363               god        trust
## 33364          accurate     positive
## 33365          accurate        trust
## 33366        aggressive        anger
## 33367        aggressive         fear
## 33368        aggressive     negative
## 33369             model     positive
## 33370              fake     negative
## 33371            pretty anticipation
## 33372            pretty          joy
## 33373            pretty     positive
## 33374            pretty        trust
## 33375          accurate     positive
## 33376          accurate        trust
## 33377          accurate     positive
## 33378          accurate        trust
## 33379            actual     positive
## 33380             wrong     negative
## 33381          increase     positive
## 33382            cancel     negative
## 33383            cancel      sadness
## 33384               sea     positive
## 33385               sea     positive
## 33386             level     positive
## 33387             level        trust
## 33388              love          joy
## 33389              love     positive
## 33390           predict anticipation
## 33391               sea     positive
## 33392             coast     positive
## 33393        prediction anticipation
## 33394              time anticipation
## 33395              bout        anger
## 33396              bout     negative
## 33397             pivot     positive
## 33398             pivot        trust
## 33399             blame        anger
## 33400             blame      disgust
## 33401             blame     negative
## 33402         ignorance     negative
## 33403              true          joy
## 33404              true     positive
## 33405              true        trust
## 33406     communication        trust
## 33407            excuse     negative
## 33408     understanding     positive
## 33409     understanding        trust
## 33410           library     positive
## 33411         stupidity     negative
## 33412            change         fear
## 33413             found          joy
## 33414             found     positive
## 33415             found        trust
## 33416        irrational      disgust
## 33417        irrational         fear
## 33418        irrational     negative
## 33419          surprise         fear
## 33420          surprise          joy
## 33421          surprise     positive
## 33422          surprise     surprise
## 33423         arguments        anger
## 33424        scientific     positive
## 33425        scientific        trust
## 33426             wrong     negative
## 33427             wrong     negative
## 33428     communication        trust
## 33429         atrocious        anger
## 33430         atrocious      disgust
## 33431         atrocious     negative
## 33432            change         fear
## 33433            poorly     negative
## 33434       communicate     positive
## 33435       communicate        trust
## 33436            pretty anticipation
## 33437            pretty          joy
## 33438            pretty     positive
## 33439            pretty        trust
## 33440               fun anticipation
## 33441               fun          joy
## 33442               fun     positive
## 33443           knowing     positive
## 33444        scientific     positive
## 33445        scientific        trust
## 33446           ability     positive
## 33447               job     positive
## 33448             noble     positive
## 33449             noble        trust
## 33450          ignorant      disgust
## 33451          ignorant     negative
## 33452              time anticipation
## 33453             share anticipation
## 33454             share          joy
## 33455             share     positive
## 33456             share        trust
## 33457            public anticipation
## 33458            public     positive
## 33459            victim        anger
## 33460            victim         fear
## 33461            victim     negative
## 33462            victim      sadness
## 33463              quit     negative
## 33464              baby          joy
## 33465              baby     positive
## 33466             crazy        anger
## 33467             crazy         fear
## 33468             crazy     negative
## 33469             crazy      sadness
## 33470        conspiracy         fear
## 33471               job     positive
## 33472         receiving anticipation
## 33473         receiving          joy
## 33474         receiving     positive
## 33475         receiving     surprise
## 33476               job     positive
## 33477           honesty     positive
## 33478           honesty        trust
## 33479         integrity     positive
## 33480         integrity        trust
## 33481              lead     positive
## 33482         declining     negative
## 33483         qualified     positive
## 33484         qualified        trust
## 33485         concerned         fear
## 33486         concerned      sadness
## 33487            reason     positive
## 33488              quit     negative
## 33489         harassing        anger
## 33490          continue anticipation
## 33491          continue     positive
## 33492          continue        trust
## 33493              lack     negative
## 33494         humiliate        anger
## 33495         humiliate     negative
## 33496         humiliate      sadness
## 33497               cry     negative
## 33498               cry      sadness
## 33499           deserve        anger
## 33500           deserve anticipation
## 33501           deserve     positive
## 33502           deserve        trust
## 33503          sympathy     positive
## 33504          sympathy      sadness
## 33505            crying     negative
## 33506            crying      sadness
## 33507            change         fear
## 33508              quit     negative
## 33509            change         fear
## 33510           exposed     negative
## 33511            change         fear
## 33512         anonymous     negative
## 33513            insane        anger
## 33514            insane         fear
## 33515            insane     negative
## 33516             start anticipation
## 33517         harassing        anger
## 33518       threatening        anger
## 33519       threatening      disgust
## 33520       threatening         fear
## 33521       threatening     negative
## 33522          violence        anger
## 33523          violence         fear
## 33524          violence     negative
## 33525          violence      sadness
## 33526           account        trust
## 33527         disappear         fear
## 33528               don     positive
## 33529               don        trust
## 33530           ability     positive
## 33531             worry anticipation
## 33532             worry         fear
## 33533             worry     negative
## 33534             worry      sadness
## 33535               don     positive
## 33536               don        trust
## 33537         hypocrisy     negative
## 33538               job     positive
## 33539         harassing        anger
## 33540          personal        trust
## 33541             upset        anger
## 33542             upset     negative
## 33543             upset      sadness
## 33544              quit     negative
## 33545            harass        anger
## 33546            harass      disgust
## 33547            harass     negative
## 33548          disagree        anger
## 33549          disagree     negative
## 33550            public anticipation
## 33551            public     positive
## 33552      professional     positive
## 33553      professional        trust
## 33554            expect anticipation
## 33555            expect     positive
## 33556            expect     surprise
## 33557            expect        trust
## 33558          disagree        anger
## 33559          disagree     negative
## 33560              quit     negative
## 33561         hypocrite      disgust
## 33562         hypocrite     negative
## 33563             faith anticipation
## 33564             faith          joy
## 33565             faith     positive
## 33566             faith        trust
## 33567              earn     positive
## 33568             build     positive
## 33569           discord        anger
## 33570           discord      disgust
## 33571           discord     negative
## 33572       communicate     positive
## 33573       communicate        trust
## 33574            fellow     positive
## 33575            fellow        trust
## 33576              join     positive
## 33577          moderate     positive
## 33578            action     positive
## 33579           contact     positive
## 33580             sense     positive
## 33581             blame        anger
## 33582             blame      disgust
## 33583             blame     negative
## 33584             shell        anger
## 33585             shell         fear
## 33586             shell     negative
## 33587             shell      sadness
## 33588             shell     surprise
## 33589             blame        anger
## 33590             blame      disgust
## 33591             blame     negative
## 33592       responsible     positive
## 33593       responsible        trust
## 33594            change         fear
## 33595             wrong     negative
## 33596           lunatic        anger
## 33597           lunatic      disgust
## 33598           lunatic         fear
## 33599           lunatic     negative
## 33600             wrong     negative
## 33601            change         fear
## 33602              real     positive
## 33603              real        trust
## 33604            change         fear
## 33605         believing     positive
## 33606         believing        trust
## 33607          majority          joy
## 33608          majority     positive
## 33609          majority        trust
## 33610             wrong     negative
## 33611          drinking     negative
## 33612               aid     positive
## 33613              real     positive
## 33614              real        trust
## 33615            denial     negative
## 33616              gain anticipation
## 33617              gain          joy
## 33618              gain     positive
## 33619            change         fear
## 33620              hoax        anger
## 33621              hoax      disgust
## 33622              hoax     negative
## 33623              hoax      sadness
## 33624              hoax     surprise
## 33625        supporting     positive
## 33626        supporting        trust
## 33627            change         fear
## 33628              hoax        anger
## 33629              hoax      disgust
## 33630              hoax     negative
## 33631              hoax      sadness
## 33632              hoax     surprise
## 33633               eat     positive
## 33634           limited        anger
## 33635           limited     negative
## 33636           limited      sadness
## 33637             money        anger
## 33638             money anticipation
## 33639             money          joy
## 33640             money     positive
## 33641             money     surprise
## 33642             money        trust
## 33643             clean          joy
## 33644             clean     positive
## 33645             clean        trust
## 33646              mess      disgust
## 33647              mess     negative
## 33648            change         fear
## 33649          drinking     negative
## 33650             trump     surprise
## 33651           culture     positive
## 33652           useless     negative
## 33653       information     positive
## 33654              hope anticipation
## 33655              hope          joy
## 33656              hope     positive
## 33657              hope     surprise
## 33658              hope        trust
## 33659          recovery     positive
## 33660            refuse     negative
## 33661              rest     positive
## 33662          ignorant      disgust
## 33663          ignorant     negative
## 33664           citizen     positive
## 33665              lazy     negative
## 33666          ignorant      disgust
## 33667          ignorant     negative
## 33668           heavily     negative
## 33669            system        trust
## 33670            change         fear
## 33671              true          joy
## 33672              true     positive
## 33673              true        trust
## 33674            system        trust
## 33675        propaganda     negative
## 33676           machine        trust
## 33677              risk anticipation
## 33678              risk         fear
## 33679              risk     negative
## 33680            income anticipation
## 33681            income          joy
## 33682            income     negative
## 33683            income     positive
## 33684            income      sadness
## 33685            income        trust
## 33686        tantamount        trust
## 33687              ruin         fear
## 33688              ruin     negative
## 33689              ruin      sadness
## 33690             wages          joy
## 33691             wages     positive
## 33692              time anticipation
## 33693          organize     positive
## 33694              risk anticipation
## 33695              risk         fear
## 33696              risk     negative
## 33697            losing        anger
## 33698            losing     negative
## 33699            losing      sadness
## 33700           citizen     positive
## 33701            afraid         fear
## 33702            afraid     negative
## 33703            losing        anger
## 33704            losing     negative
## 33705            losing      sadness
## 33706          military         fear
## 33707             force        anger
## 33708             force         fear
## 33709             force     negative
## 33710        permission     positive
## 33711              kill         fear
## 33712              kill     negative
## 33713              kill      sadness
## 33714           illegal        anger
## 33715           illegal      disgust
## 33716           illegal         fear
## 33717           illegal     negative
## 33718           illegal      sadness
## 33719      questionable      disgust
## 33720      questionable     negative
## 33721         oversight     negative
## 33722              jail         fear
## 33723              jail     negative
## 33724              jail      sadness
## 33725              real     positive
## 33726              real        trust
## 33727              risk anticipation
## 33728              risk         fear
## 33729              risk     negative
## 33730        mysterious anticipation
## 33731        mysterious         fear
## 33732        mysterious     surprise
## 33733             death        anger
## 33734             death anticipation
## 33735             death      disgust
## 33736             death         fear
## 33737             death     negative
## 33738             death      sadness
## 33739             death     surprise
## 33740           delayed     negative
## 33741             leave     negative
## 33742             leave      sadness
## 33743             leave     surprise
## 33744              jail         fear
## 33745              jail     negative
## 33746              jail      sadness
## 33747            income anticipation
## 33748            income          joy
## 33749            income     negative
## 33750            income     positive
## 33751            income      sadness
## 33752            income        trust
## 33753      overwhelming     positive
## 33754             force        anger
## 33755             force         fear
## 33756             force     negative
## 33757        successful anticipation
## 33758        successful          joy
## 33759        successful     positive
## 33760        successful        trust
## 33761            actual     positive
## 33762            policy        trust
## 33763              real     positive
## 33764              real        trust
## 33765        widespread     positive
## 33766           obvious     positive
## 33767           obvious        trust
## 33768          cohesive     positive
## 33769          cohesive        trust
## 33770            system        trust
## 33771         difficult         fear
## 33772           finally anticipation
## 33773           finally      disgust
## 33774           finally          joy
## 33775           finally     positive
## 33776           finally     surprise
## 33777           finally        trust
## 33778              risk anticipation
## 33779              risk         fear
## 33780              risk     negative
## 33781             death        anger
## 33782             death anticipation
## 33783             death      disgust
## 33784             death         fear
## 33785             death     negative
## 33786             death      sadness
## 33787             death     surprise
## 33788        starvation         fear
## 33789        starvation     negative
## 33790        starvation      sadness
## 33791              ruin         fear
## 33792              ruin     negative
## 33793              ruin      sadness
## 33794            afraid         fear
## 33795            afraid     negative
## 33796               war         fear
## 33797               war     negative
## 33798              real     positive
## 33799              real        trust
## 33800            option     positive
## 33801             money        anger
## 33802             money anticipation
## 33803             money          joy
## 33804             money     positive
## 33805             money     surprise
## 33806             money        trust
## 33807          homeless        anger
## 33808          homeless anticipation
## 33809          homeless      disgust
## 33810          homeless         fear
## 33811          homeless     negative
## 33812          homeless      sadness
## 33813               don     positive
## 33814               don        trust
## 33815             money        anger
## 33816             money anticipation
## 33817             money          joy
## 33818             money     positive
## 33819             money     surprise
## 33820             money        trust
## 33821             worry anticipation
## 33822             worry         fear
## 33823             worry     negative
## 33824             worry      sadness
## 33825            system        trust
## 33826        population     positive
## 33827           survive     positive
## 33828         insidious        anger
## 33829         insidious      disgust
## 33830         insidious         fear
## 33831         insidious     negative
## 33832           missing         fear
## 33833           missing     negative
## 33834           missing      sadness
## 33835              time anticipation
## 33836             extra     positive
## 33837             break     surprise
## 33838            police         fear
## 33839            police     positive
## 33840            police        trust
## 33841             serve     negative
## 33842             serve        trust
## 33843               war         fear
## 33844               war     negative
## 33845             sadly     negative
## 33846             sadly      sadness
## 33847         convinced        trust
## 33848              shit        anger
## 33849              shit      disgust
## 33850              shit     negative
## 33851          decrease     negative
## 33852           economy        trust
## 33853             seize         fear
## 33854             seize     negative
## 33855           machine        trust
## 33856              wait anticipation
## 33857              wait     negative
## 33858            afford     positive
## 33859            rugged     negative
## 33860              main     positive
## 33861            reason     positive
## 33862              fear        anger
## 33863              fear         fear
## 33864              fear     negative
## 33865              real     positive
## 33866              real        trust
## 33867              fear        anger
## 33868              fear         fear
## 33869              fear     negative
## 33870         acquiring anticipation
## 33871         acquiring     positive
## 33872          criminal        anger
## 33873          criminal      disgust
## 33874          criminal         fear
## 33875          criminal     negative
## 33876        consequent anticipation
## 33877         exclusion      disgust
## 33878         exclusion         fear
## 33879         exclusion     negative
## 33880         exclusion      sadness
## 33881           economy        trust
## 33882            prison        anger
## 33883            prison         fear
## 33884            prison     negative
## 33885            prison      sadness
## 33886        population     positive
## 33887          symbolic     positive
## 33888            degree     positive
## 33889        repression         fear
## 33890        repression     negative
## 33891            wealth          joy
## 33892            wealth     positive
## 33893            wealth        trust
## 33894        inequality        anger
## 33895        inequality         fear
## 33896        inequality     negative
## 33897        inequality      sadness
## 33898        corruption      disgust
## 33899        corruption     negative
## 33900             worse         fear
## 33901             worse     negative
## 33902             worse      sadness
## 33903         revolting        anger
## 33904         revolting      disgust
## 33905         revolting         fear
## 33906         revolting     negative
## 33907        oppression        anger
## 33908        oppression      disgust
## 33909        oppression         fear
## 33910        oppression     negative
## 33911        oppression      sadness
## 33912         effective     positive
## 33913         effective        trust
## 33914              food          joy
## 33915              food     positive
## 33916              food        trust
## 33917           villain         fear
## 33918           villain     negative
## 33919          engaging          joy
## 33920          engaging     positive
## 33921          engaging        trust
## 33922          engaging          joy
## 33923          engaging     positive
## 33924          engaging        trust
## 33925              sour      disgust
## 33926              sour     negative
## 33927              wait anticipation
## 33928              wait     negative
## 33929            famine     negative
## 33930            famine      sadness
## 33931          homeless        anger
## 33932          homeless anticipation
## 33933          homeless      disgust
## 33934          homeless         fear
## 33935          homeless     negative
## 33936          homeless      sadness
## 33937          religion        trust
## 33938             cheap     negative
## 33939              junk     negative
## 33940            opiate     negative
## 33941               eat     positive
## 33942             watch anticipation
## 33943             watch         fear
## 33944               pay anticipation
## 33945               pay          joy
## 33946               pay     positive
## 33947               pay        trust
## 33948               fun anticipation
## 33949               fun          joy
## 33950               fun     positive
## 33951          collapse      disgust
## 33952          collapse         fear
## 33953          collapse     negative
## 33954          collapse      sadness
## 33955           drought     negative
## 33956            status     positive
## 33957             chaos        anger
## 33958             chaos         fear
## 33959             chaos     negative
## 33960             chaos      sadness
## 33961             ahead     positive
## 33962         pollution      disgust
## 33963         pollution     negative
## 33964             wrong     negative
## 33965          collapse      disgust
## 33966          collapse         fear
## 33967          collapse     negative
## 33968          collapse      sadness
## 33969          collapse      disgust
## 33970          collapse         fear
## 33971          collapse     negative
## 33972          collapse      sadness
## 33973            coming anticipation
## 33974          collapse      disgust
## 33975          collapse         fear
## 33976          collapse     negative
## 33977          collapse      sadness
## 33978            happen anticipation
## 33979               bad        anger
## 33980               bad      disgust
## 33981               bad         fear
## 33982               bad     negative
## 33983               bad      sadness
## 33984          friction        anger
## 33985              shit        anger
## 33986              shit      disgust
## 33987              shit     negative
## 33988           knowing     positive
## 33989            choice     positive
## 33990            status     positive
## 33991             waste      disgust
## 33992             waste     negative
## 33993         traveling     positive
## 33994           minimum     negative
## 33995              food          joy
## 33996              food     positive
## 33997              food        trust
## 33998              shit        anger
## 33999              shit      disgust
## 34000              shit     negative
## 34001              main     positive
## 34002               war         fear
## 34003               war     negative
## 34004       possibility anticipation
## 34005       celebrating anticipation
## 34006       celebrating          joy
## 34007       celebrating     positive
## 34008            fairly     positive
## 34009            fairly        trust
## 34010           freedom          joy
## 34011           freedom     positive
## 34012           freedom        trust
## 34013        possession        anger
## 34014        possession      disgust
## 34015        possession         fear
## 34016        possession     negative
## 34017           slavery        anger
## 34018           slavery      disgust
## 34019           slavery         fear
## 34020           slavery     negative
## 34021           slavery      sadness
## 34022         bloodshed        anger
## 34023         bloodshed      disgust
## 34024         bloodshed         fear
## 34025         bloodshed     negative
## 34026         bloodshed      sadness
## 34027         bloodshed     surprise
## 34028           slavery        anger
## 34029           slavery      disgust
## 34030           slavery         fear
## 34031           slavery     negative
## 34032           slavery      sadness
## 34033           fallacy     negative
## 34034            change         fear
## 34035            change         fear
## 34036         president     positive
## 34037         president        trust
## 34038              time anticipation
## 34039            occupy     positive
## 34040               bad        anger
## 34041               bad      disgust
## 34042               bad         fear
## 34043               bad     negative
## 34044               bad      sadness
## 34045               bad        anger
## 34046               bad      disgust
## 34047               bad         fear
## 34048               bad     negative
## 34049               bad      sadness
## 34050             civil     positive
## 34051            unrest         fear
## 34052            unrest      sadness
## 34053          majority          joy
## 34054          majority     positive
## 34055          majority        trust
## 34056          starving     negative
## 34057             agree     positive
## 34058               bad        anger
## 34059               bad      disgust
## 34060               bad         fear
## 34061               bad     negative
## 34062               bad      sadness
## 34063          collapse      disgust
## 34064          collapse         fear
## 34065          collapse     negative
## 34066          collapse      sadness
## 34067          collapse      disgust
## 34068          collapse         fear
## 34069          collapse     negative
## 34070          collapse      sadness
## 34071            revolt        anger
## 34072            revolt     negative
## 34073            revolt     surprise
## 34074             death        anger
## 34075             death anticipation
## 34076             death      disgust
## 34077             death         fear
## 34078             death     negative
## 34079             death      sadness
## 34080             death     surprise
## 34081         pollution      disgust
## 34082         pollution     negative
## 34083        conspiracy         fear
## 34084          negative     negative
## 34085          negative      sadness
## 34086          violence        anger
## 34087          violence         fear
## 34088          violence     negative
## 34089          violence      sadness
## 34090          violence        anger
## 34091          violence         fear
## 34092          violence     negative
## 34093          violence      sadness
## 34094         effective     positive
## 34095         effective        trust
## 34096          violence        anger
## 34097          violence         fear
## 34098          violence     negative
## 34099          violence      sadness
## 34100             worse         fear
## 34101             worse     negative
## 34102             worse      sadness
## 34103          collapse      disgust
## 34104          collapse         fear
## 34105          collapse     negative
## 34106          collapse      sadness
## 34107           blinded     negative
## 34108               fat      disgust
## 34109               fat     negative
## 34110               fat      sadness
## 34111              lack     negative
## 34112             moral        anger
## 34113             moral     positive
## 34114             moral        trust
## 34115           pretend     negative
## 34116              team        trust
## 34117         depressed        anger
## 34118         depressed         fear
## 34119         depressed     negative
## 34120         depressed      sadness
## 34121             watch anticipation
## 34122             watch         fear
## 34123               fun anticipation
## 34124               fun          joy
## 34125               fun     positive
## 34126              shit        anger
## 34127              shit      disgust
## 34128              shit     negative
## 34129             money        anger
## 34130             money anticipation
## 34131             money          joy
## 34132             money     positive
## 34133             money     surprise
## 34134             money        trust
## 34135              food          joy
## 34136              food     positive
## 34137              food        trust
## 34138           rotting      disgust
## 34139           rotting     negative
## 34140              junk     negative
## 34141         wholesome     positive
## 34142         wholesome        trust
## 34143             wrong     negative
## 34144             watch anticipation
## 34145             watch         fear
## 34146           killing        anger
## 34147           killing         fear
## 34148           killing     negative
## 34149           killing      sadness
## 34150      neighborhood anticipation
## 34151            sunset anticipation
## 34152            sunset     positive
## 34153          laughing          joy
## 34154          laughing     positive
## 34155          disaster        anger
## 34156          disaster      disgust
## 34157          disaster         fear
## 34158          disaster     negative
## 34159          disaster      sadness
## 34160          disaster     surprise
## 34161        celebrated anticipation
## 34162        celebrated          joy
## 34163        celebrated     positive
## 34164             farce     negative
## 34165         concerned         fear
## 34166         concerned      sadness
## 34167             enemy        anger
## 34168             enemy      disgust
## 34169             enemy         fear
## 34170             enemy     negative
## 34171             lines         fear
## 34172              time anticipation
## 34173               eat     positive
## 34174        celebrated anticipation
## 34175        celebrated          joy
## 34176        celebrated     positive
## 34177        celebrated anticipation
## 34178        celebrated          joy
## 34179        celebrated     positive
## 34180              real     positive
## 34181              real        trust
## 34182            reason     positive
## 34183            pledge          joy
## 34184            pledge     positive
## 34185            pledge        trust
## 34186        allegiance     positive
## 34187        allegiance        trust
## 34188              rule         fear
## 34189              rule        trust
## 34190            nation        trust
## 34191             money        anger
## 34192             money anticipation
## 34193             money          joy
## 34194             money     positive
## 34195             money     surprise
## 34196             money        trust
## 34197         injustice        anger
## 34198         injustice     negative
## 34199        inequality        anger
## 34200        inequality         fear
## 34201        inequality     negative
## 34202        inequality      sadness
## 34203         beautiful          joy
## 34204         beautiful     positive
## 34205             sadly     negative
## 34206             sadly      sadness
## 34207        allegiance     positive
## 34208        allegiance        trust
## 34209            pledge          joy
## 34210            pledge     positive
## 34211            pledge        trust
## 34212            pledge          joy
## 34213            pledge     positive
## 34214            pledge        trust
## 34215        allegiance     positive
## 34216        allegiance        trust
## 34217             child anticipation
## 34218             child          joy
## 34219             child     positive
## 34220               don     positive
## 34221               don        trust
## 34222            school        trust
## 34223            school        trust
## 34224            school        trust
## 34225              glad anticipation
## 34226              glad          joy
## 34227              glad     positive
## 34228             watch anticipation
## 34229             watch         fear
## 34230             watch anticipation
## 34231             watch         fear
## 34232              gasp     surprise
## 34233              love          joy
## 34234              love     positive
## 34235          offended        anger
## 34236          offended     negative
## 34237          offended      sadness
## 34238          offended        anger
## 34239          offended     negative
## 34240          offended      sadness
## 34241            denial     negative
## 34242        celebrated anticipation
## 34243        celebrated          joy
## 34244        celebrated     positive
## 34245             fancy anticipation
## 34246             fancy          joy
## 34247             fancy     positive
## 34248             farce     negative
## 34249           perfect anticipation
## 34250           perfect          joy
## 34251           perfect     positive
## 34252           perfect        trust
## 34253            change         fear
## 34254            public anticipation
## 34255            public     positive
## 34256     uncomfortable     negative
## 34257               bad        anger
## 34258               bad      disgust
## 34259               bad         fear
## 34260               bad     negative
## 34261               bad      sadness
## 34262             start anticipation
## 34263             nerve     positive
## 34264         destroyed        anger
## 34265         destroyed         fear
## 34266         destroyed     negative
## 34267         destroyed      sadness
## 34268              love          joy
## 34269              love     positive
## 34270              love          joy
## 34271              love     positive
## 34272            forced         fear
## 34273            forced     negative
## 34274           worship anticipation
## 34275           worship         fear
## 34276           worship          joy
## 34277           worship     positive
## 34278           worship        trust
## 34279          military         fear
## 34280          personal        trust
## 34281              sham        anger
## 34282              sham      disgust
## 34283              sham     negative
## 34284    indoctrination        anger
## 34285    indoctrination         fear
## 34286    indoctrination     negative
## 34287             title     positive
## 34288             title        trust
## 34289       meaningless     negative
## 34290       meaningless      sadness
## 34291          personal        trust
## 34292              wont anticipation
## 34293         hypocrite      disgust
## 34294         hypocrite     negative
## 34295    indoctrination        anger
## 34296    indoctrination         fear
## 34297    indoctrination     negative
## 34298            shabby      disgust
## 34299            shabby     negative
## 34300         effective     positive
## 34301         effective        trust
## 34302        propaganda     negative
## 34303           disgust        anger
## 34304           disgust      disgust
## 34305           disgust         fear
## 34306           disgust     negative
## 34307           disgust      sadness
## 34308            system        trust
## 34309             troll        anger
## 34310             troll         fear
## 34311             troll     negative
## 34312              hope anticipation
## 34313              hope          joy
## 34314              hope     positive
## 34315              hope     surprise
## 34316              hope        trust
## 34317               fun anticipation
## 34318               fun          joy
## 34319               fun     positive
## 34320             enjoy anticipation
## 34321             enjoy          joy
## 34322             enjoy     positive
## 34323             enjoy        trust
## 34324              copy     negative
## 34325             sadly     negative
## 34326             sadly      sadness
## 34327        allegiance     positive
## 34328        allegiance        trust
## 34329            pledge          joy
## 34330            pledge     positive
## 34331            pledge        trust
## 34332             enemy        anger
## 34333             enemy      disgust
## 34334             enemy         fear
## 34335             enemy     negative
## 34336             lines         fear
## 34337           hostage        anger
## 34338           hostage         fear
## 34339           hostage     negative
## 34340             agree     positive
## 34341              time anticipation
## 34342            nation        trust
## 34343          military         fear
## 34344         democracy     positive
## 34345         democracy     positive
## 34346         resources          joy
## 34347         resources     positive
## 34348         resources        trust
## 34349        disastrous        anger
## 34350        disastrous         fear
## 34351        disastrous     negative
## 34352        disastrous      sadness
## 34353            nation        trust
## 34354          guzzling     negative
## 34355            flying         fear
## 34356            flying     positive
## 34357          continue anticipation
## 34358          continue     positive
## 34359          continue        trust
## 34360           achieve          joy
## 34361           achieve     positive
## 34362           achieve        trust
## 34363           neutral anticipation
## 34364           neutral        trust
## 34365             clock anticipation
## 34366             shame      disgust
## 34367             shame         fear
## 34368             shame     negative
## 34369             shame      sadness
## 34370            refuse     negative
## 34371             adapt     positive
## 34372             learn     positive
## 34373               ban     negative
## 34374               hot        anger
## 34375             death        anger
## 34376             death anticipation
## 34377             death      disgust
## 34378             death         fear
## 34379             death     negative
## 34380             death      sadness
## 34381             death     surprise
## 34382           holiday anticipation
## 34383           holiday          joy
## 34384           holiday     positive
## 34385            appeal anticipation
## 34386            brains     positive
## 34387            expect anticipation
## 34388            expect     positive
## 34389            expect     surprise
## 34390            expect        trust
## 34391            brains     positive
## 34392           pollute      disgust
## 34393           pollute     negative
## 34394            change         fear
## 34395              love          joy
## 34396              love     positive
## 34397           forgive     positive
## 34398          grateful     positive
## 34399             alive anticipation
## 34400             alive          joy
## 34401             alive     positive
## 34402             alive        trust
## 34403          grateful     positive
## 34404            loving          joy
## 34405            loving     positive
## 34406            loving        trust
## 34407        celebrated anticipation
## 34408        celebrated          joy
## 34409        celebrated     positive
## 34410             worth     positive
## 34411       celebrating anticipation
## 34412       celebrating          joy
## 34413       celebrating     positive
## 34414             start anticipation
## 34415        revolution        anger
## 34416        revolution anticipation
## 34417        revolution         fear
## 34418        revolution     negative
## 34419        revolution     positive
## 34420        revolution      sadness
## 34421        revolution     surprise
## 34422            broken        anger
## 34423            broken         fear
## 34424            broken     negative
## 34425            broken      sadness
## 34426          intended anticipation
## 34427          intended     positive
## 34428            change         fear
## 34429            happen anticipation
## 34430          majority          joy
## 34431          majority     positive
## 34432          majority        trust
## 34433             guess     surprise
## 34434       celebrating anticipation
## 34435       celebrating          joy
## 34436       celebrating     positive
## 34437           freedom          joy
## 34438           freedom     positive
## 34439           freedom        trust
## 34440               pay anticipation
## 34441               pay          joy
## 34442               pay     positive
## 34443               pay        trust
## 34444          tomorrow anticipation
## 34445          stealing      disgust
## 34446          stealing         fear
## 34447          stealing     negative
## 34448              land     positive
## 34449        capitalist     positive
## 34450           killing        anger
## 34451           killing         fear
## 34452           killing     negative
## 34453           killing      sadness
## 34454            cherry     positive
## 34455               top anticipation
## 34456               top     positive
## 34457               top        trust
## 34458              time anticipation
## 34459          homeless        anger
## 34460          homeless anticipation
## 34461          homeless      disgust
## 34462          homeless         fear
## 34463          homeless     negative
## 34464          homeless      sadness
## 34465               war         fear
## 34466               war     negative
## 34467           mimicry     negative
## 34468           mimicry     surprise
## 34469       celebrating anticipation
## 34470       celebrating          joy
## 34471       celebrating     positive
## 34472           freedom          joy
## 34473           freedom     positive
## 34474           freedom        trust
## 34475           freedom          joy
## 34476           freedom     positive
## 34477           freedom        trust
## 34478           killing        anger
## 34479           killing         fear
## 34480           killing     negative
## 34481           killing      sadness
## 34482          shooting        anger
## 34483          shooting         fear
## 34484          shooting     negative
## 34485            poison        anger
## 34486            poison      disgust
## 34487            poison         fear
## 34488            poison     negative
## 34489            poison      sadness
## 34490           freedom          joy
## 34491           freedom     positive
## 34492           freedom        trust
## 34493             clean          joy
## 34494             clean     positive
## 34495             clean        trust
## 34496            status     positive
## 34497         blindness     negative
## 34498         blindness      sadness
## 34499              kill         fear
## 34500              kill     negative
## 34501              kill      sadness
## 34502           cutting        anger
## 34503           cutting      disgust
## 34504           cutting         fear
## 34505           cutting     negative
## 34506           cutting      sadness
## 34507            supply     positive
## 34508           thirsty     negative
## 34509            happen anticipation
## 34510            happen anticipation
## 34511           foreign     negative
## 34512            supply     positive
## 34513            reason     positive
## 34514          homeless        anger
## 34515          homeless anticipation
## 34516          homeless      disgust
## 34517          homeless         fear
## 34518          homeless     negative
## 34519          homeless      sadness
## 34520         screaming        anger
## 34521         screaming      disgust
## 34522         screaming         fear
## 34523         screaming     negative
## 34524             agony        anger
## 34525             agony         fear
## 34526             agony     negative
## 34527             agony      sadness
## 34528           falling     negative
## 34529           falling      sadness
## 34530              rest     positive
## 34531             learn     positive
## 34532            ignore     negative
## 34533             agree     positive
## 34534               hot        anger
## 34535              time anticipation
## 34536               sky     positive
## 34537              shit        anger
## 34538              shit      disgust
## 34539              shit     negative
## 34540              time anticipation
## 34541              time anticipation
## 34542            pretty anticipation
## 34543            pretty          joy
## 34544            pretty     positive
## 34545            pretty        trust
## 34546             shock        anger
## 34547             shock         fear
## 34548             shock     negative
## 34549             shock     surprise
## 34550          collapse      disgust
## 34551          collapse         fear
## 34552          collapse     negative
## 34553          collapse      sadness
## 34554            happen anticipation
## 34555              star anticipation
## 34556              star          joy
## 34557              star     positive
## 34558              star        trust
## 34559             focus     positive
## 34560       celebrating anticipation
## 34561       celebrating          joy
## 34562       celebrating     positive
## 34563      independence anticipation
## 34564      independence          joy
## 34565      independence     positive
## 34566      independence     surprise
## 34567      independence        trust
## 34568      independence anticipation
## 34569      independence          joy
## 34570      independence     positive
## 34571      independence     surprise
## 34572      independence        trust
## 34573      independence anticipation
## 34574      independence          joy
## 34575      independence     positive
## 34576      independence     surprise
## 34577      independence        trust
## 34578              king     positive
## 34579       corporation     positive
## 34580       corporation        trust
## 34581             argue        anger
## 34582             argue     negative
## 34583      independence anticipation
## 34584      independence          joy
## 34585      independence     positive
## 34586      independence     surprise
## 34587      independence        trust
## 34588          fighting        anger
## 34589          fighting     negative
## 34590              plan anticipation
## 34591        revolution        anger
## 34592        revolution anticipation
## 34593        revolution         fear
## 34594        revolution     negative
## 34595        revolution     positive
## 34596        revolution      sadness
## 34597        revolution     surprise
## 34598           obvious     positive
## 34599           obvious        trust
## 34600         miserable        anger
## 34601         miserable      disgust
## 34602         miserable     negative
## 34603         miserable      sadness
## 34604              hope anticipation
## 34605              hope          joy
## 34606              hope     positive
## 34607              hope     surprise
## 34608              hope        trust
## 34609            broken        anger
## 34610            broken         fear
## 34611            broken     negative
## 34612            broken      sadness
## 34613             offer     positive
## 34614          complain        anger
## 34615          complain     negative
## 34616          complain      sadness
## 34617              flee         fear
## 34618              flee     negative
## 34619               don     positive
## 34620               don        trust
## 34621               don     positive
## 34622               don        trust
## 34623              fair     positive
## 34624             focus     positive
## 34625         statement     positive
## 34626         statement        trust
## 34627             pride          joy
## 34628             pride     positive
## 34629            stolen        anger
## 34630            stolen     negative
## 34631              land     positive
## 34632             steal        anger
## 34633             steal         fear
## 34634             steal     negative
## 34635             steal      sadness
## 34636              land     positive
## 34637            refuse     negative
## 34638        punishment        anger
## 34639        punishment      disgust
## 34640        punishment         fear
## 34641        punishment     negative
## 34642             blame        anger
## 34643             blame      disgust
## 34644             blame     negative
## 34645             alive anticipation
## 34646             alive          joy
## 34647             alive     positive
## 34648             alive        trust
## 34649       responsible     positive
## 34650       responsible        trust
## 34651         hyperbole     negative
## 34652          homeless        anger
## 34653          homeless anticipation
## 34654          homeless      disgust
## 34655          homeless         fear
## 34656          homeless     negative
## 34657          homeless      sadness
## 34658              debt     negative
## 34659              debt      sadness
## 34660         believing     positive
## 34661         believing        trust
## 34662          grasping anticipation
## 34663          grasping     negative
## 34664              hope anticipation
## 34665              hope          joy
## 34666              hope     positive
## 34667              hope     surprise
## 34668              hope        trust
## 34669            coming anticipation
## 34670            mighty        anger
## 34671            mighty         fear
## 34672            mighty          joy
## 34673            mighty     positive
## 34674            mighty        trust
## 34675          homeless        anger
## 34676          homeless anticipation
## 34677          homeless      disgust
## 34678          homeless         fear
## 34679          homeless     negative
## 34680          homeless      sadness
## 34681        population     positive
## 34682            pretty anticipation
## 34683            pretty          joy
## 34684            pretty     positive
## 34685            pretty        trust
## 34686               bad        anger
## 34687               bad      disgust
## 34688               bad         fear
## 34689               bad     negative
## 34690               bad      sadness
## 34691              love          joy
## 34692              love     positive
## 34693      organization anticipation
## 34694      organization          joy
## 34695      organization     positive
## 34696      organization     surprise
## 34697      organization        trust
## 34698               sir     positive
## 34699               sir        trust
## 34700            august     positive
## 34701             beach          joy
## 34702       celebrating anticipation
## 34703       celebrating          joy
## 34704       celebrating     positive
## 34705       celebrating anticipation
## 34706       celebrating          joy
## 34707       celebrating     positive
## 34708              damn        anger
## 34709              damn      disgust
## 34710              damn     negative
## 34711              cool     positive
## 34712           reading     positive
## 34713           feeling        anger
## 34714           feeling anticipation
## 34715           feeling      disgust
## 34716           feeling         fear
## 34717           feeling          joy
## 34718           feeling     negative
## 34719           feeling     positive
## 34720           feeling      sadness
## 34721           feeling     surprise
## 34722           feeling        trust
## 34723           disgust        anger
## 34724           disgust      disgust
## 34725           disgust         fear
## 34726           disgust     negative
## 34727           disgust      sadness
## 34728             angry        anger
## 34729             angry      disgust
## 34730             angry     negative
## 34731             enjoy anticipation
## 34732             enjoy          joy
## 34733             enjoy     positive
## 34734             enjoy        trust
## 34735           holiday anticipation
## 34736           holiday          joy
## 34737           holiday     positive
## 34738               fun anticipation
## 34739               fun          joy
## 34740               fun     positive
## 34741              swim anticipation
## 34742              swim         fear
## 34743              swim          joy
## 34744              swim     positive
## 34745               don     positive
## 34746               don        trust
## 34747            regret     negative
## 34748            regret      sadness
## 34749            father        trust
## 34750         estranged     negative
## 34751            change         fear
## 34752          personal        trust
## 34753            change         fear
## 34754             worth     positive
## 34755       celebrating anticipation
## 34756       celebrating          joy
## 34757       celebrating     positive
## 34758         communist     negative
## 34759           freedom          joy
## 34760           freedom     positive
## 34761           freedom        trust
## 34762              hope anticipation
## 34763              hope          joy
## 34764              hope     positive
## 34765              hope     surprise
## 34766              hope        trust
## 34767              love          joy
## 34768              love     positive
## 34769              land     positive
## 34770               sea     positive
## 34771           partake     positive
## 34772           partake        trust
## 34773            boring     negative
## 34774              time anticipation
## 34775          increase     positive
## 34776           primary     positive
## 34777           glacial     negative
## 34778              calm     positive
## 34779               sea     positive
## 34780         ignorance     negative
## 34781            change         fear
## 34782         knowledge     positive
## 34783              time anticipation
## 34784          doomsday        anger
## 34785          doomsday anticipation
## 34786          doomsday      disgust
## 34787          doomsday         fear
## 34788          doomsday     negative
## 34789          doomsday      sadness
## 34790           balance     positive
## 34791            growth     positive
## 34792              pick     positive
## 34793           worried     negative
## 34794           worried      sadness
## 34795          continue anticipation
## 34796          continue     positive
## 34797          continue        trust
## 34798           pretend     negative
## 34799            degree     positive
## 34800         president     positive
## 34801         president        trust
## 34802             worse         fear
## 34803             worse     negative
## 34804             worse      sadness
## 34805            leader     positive
## 34806            leader        trust
## 34807            change         fear
## 34808             lower     negative
## 34809             lower      sadness
## 34810             strip     negative
## 34811             strip      sadness
## 34812            change         fear
## 34813           economy        trust
## 34814            change         fear
## 34815             awful        anger
## 34816             awful      disgust
## 34817             awful         fear
## 34818             awful     negative
## 34819             awful      sadness
## 34820              mess      disgust
## 34821              mess     negative
## 34822           supreme     positive
## 34823             court        anger
## 34824             court anticipation
## 34825             court         fear
## 34826            stolen        anger
## 34827            stolen     negative
## 34828              gore        anger
## 34829              gore      disgust
## 34830              gore         fear
## 34831              gore     negative
## 34832              gore      sadness
## 34833            doomed         fear
## 34834            doomed     negative
## 34835            doomed      sadness
## 34836            doomed         fear
## 34837            doomed     negative
## 34838            doomed      sadness
## 34839         efficient anticipation
## 34840         efficient     positive
## 34841         efficient        trust
## 34842              kill         fear
## 34843              kill     negative
## 34844              kill      sadness
## 34845            pretty anticipation
## 34846            pretty          joy
## 34847            pretty     positive
## 34848            pretty        trust
## 34849              fate anticipation
## 34850              fate     negative
## 34851               die         fear
## 34852               die     negative
## 34853               die      sadness
## 34854            suffer     negative
## 34855           killing        anger
## 34856           killing         fear
## 34857           killing     negative
## 34858           killing      sadness
## 34859            change         fear
## 34860               pay anticipation
## 34861               pay          joy
## 34862               pay     positive
## 34863               pay        trust
## 34864            forced         fear
## 34865            forced     negative
## 34866            change         fear
## 34867            horror        anger
## 34868            horror      disgust
## 34869            horror         fear
## 34870            horror     negative
## 34871            horror      sadness
## 34872            horror     surprise
## 34873            happen anticipation
## 34874              slip     negative
## 34875              slip     surprise
## 34876              real     positive
## 34877              real        trust
## 34878               bad        anger
## 34879               bad      disgust
## 34880               bad         fear
## 34881               bad     negative
## 34882               bad      sadness
## 34883             leave     negative
## 34884             leave      sadness
## 34885             leave     surprise
## 34886            afraid         fear
## 34887            afraid     negative
## 34888            escape anticipation
## 34889            escape         fear
## 34890            escape     negative
## 34891            escape     positive
## 34892            change         fear
## 34893            hatred        anger
## 34894            hatred      disgust
## 34895            hatred         fear
## 34896            hatred     negative
## 34897            hatred      sadness
## 34898             anger        anger
## 34899             anger     negative
## 34900            coming anticipation
## 34901          prepared anticipation
## 34902          prepared     positive
## 34903          prepared        trust
## 34904               gun        anger
## 34905               gun         fear
## 34906               gun     negative
## 34907          violence        anger
## 34908          violence         fear
## 34909          violence     negative
## 34910          violence      sadness
## 34911            escape anticipation
## 34912            escape         fear
## 34913            escape     negative
## 34914            escape     positive
## 34915              calm     positive
## 34916          personal        trust
## 34917              true          joy
## 34918              true     positive
## 34919              true        trust
## 34920               sex anticipation
## 34921               sex          joy
## 34922               sex     positive
## 34923               sex        trust
## 34924              shit        anger
## 34925              shit      disgust
## 34926              shit     negative
## 34927              kill         fear
## 34928              kill     negative
## 34929              kill      sadness
## 34930             enjoy anticipation
## 34931             enjoy          joy
## 34932             enjoy     positive
## 34933             enjoy        trust
## 34934             fight        anger
## 34935             fight         fear
## 34936             fight     negative
## 34937             enjoy anticipation
## 34938             enjoy          joy
## 34939             enjoy     positive
## 34940             enjoy        trust
## 34941             daily anticipation
## 34942       meaningless     negative
## 34943       meaningless      sadness
## 34944           benefit     positive
## 34945       meaningless     negative
## 34946       meaningless      sadness
## 34947              hell        anger
## 34948              hell      disgust
## 34949              hell         fear
## 34950              hell     negative
## 34951              hell      sadness
## 34952               sun anticipation
## 34953               sun          joy
## 34954               sun     positive
## 34955               sun     surprise
## 34956               sun        trust
## 34957               sun anticipation
## 34958               sun          joy
## 34959               sun     positive
## 34960               sun     surprise
## 34961               sun        trust
## 34962           survive     positive
## 34963           survive     positive
## 34964            pretty anticipation
## 34965            pretty          joy
## 34966            pretty     positive
## 34967            pretty        trust
## 34968             worse         fear
## 34969             worse     negative
## 34970             worse      sadness
## 34971             worse         fear
## 34972             worse     negative
## 34973             worse      sadness
## 34974         existence     positive
## 34975             death        anger
## 34976             death anticipation
## 34977             death      disgust
## 34978             death         fear
## 34979             death     negative
## 34980             death      sadness
## 34981             death     surprise
## 34982           deserve        anger
## 34983           deserve anticipation
## 34984           deserve     positive
## 34985           deserve        trust
## 34986          humanity          joy
## 34987          humanity     positive
## 34988          humanity        trust
## 34989        completely     positive
## 34990             enjoy anticipation
## 34991             enjoy          joy
## 34992             enjoy     positive
## 34993             enjoy        trust
## 34994              rest     positive
## 34995         normality     positive
## 34996              bias        anger
## 34997              bias     negative
## 34998           symptom     negative
## 34999           disease        anger
## 35000           disease      disgust
## 35001           disease         fear
## 35002           disease     negative
## 35003           disease      sadness
## 35004          suddenly     surprise
## 35005             toast          joy
## 35006             toast     positive
## 35007               fun anticipation
## 35008               fun          joy
## 35009               fun     positive
## 35010              hate        anger
## 35011              hate      disgust
## 35012              hate         fear
## 35013              hate     negative
## 35014              hate      sadness
## 35015             angry        anger
## 35016             angry      disgust
## 35017             angry     negative
## 35018        population     positive
## 35019              rest     positive
## 35020           hostage        anger
## 35021           hostage         fear
## 35022           hostage     negative
## 35023             sweet anticipation
## 35024             sweet          joy
## 35025             sweet     positive
## 35026             sweet     surprise
## 35027             sweet        trust
## 35028             mercy     positive
## 35029            stupid     negative
## 35030            greedy      disgust
## 35031            greedy     negative
## 35032           explain     positive
## 35033           explain        trust
## 35034               gun        anger
## 35035               gun         fear
## 35036               gun     negative
## 35037        hypothesis anticipation
## 35038        hypothesis     surprise
## 35039             clown anticipation
## 35040             clown          joy
## 35041             clown     positive
## 35042             clown     surprise
## 35043            series        trust
## 35044          infinity anticipation
## 35045          infinity          joy
## 35046          infinity     positive
## 35047          infinity        trust
## 35048             share anticipation
## 35049             share          joy
## 35050             share     positive
## 35051             share        trust
## 35052         resources          joy
## 35053         resources     positive
## 35054         resources        trust
## 35055              mail anticipation
## 35056            series        trust
## 35057      instructions anticipation
## 35058      instructions        trust
## 35059           account        trust
## 35060       established          joy
## 35061       established     positive
## 35062             guide     positive
## 35063             guide        trust
## 35064              plan anticipation
## 35065             watch anticipation
## 35066             watch         fear
## 35067            change         fear
## 35068              plan anticipation
## 35069            jungle         fear
## 35070          approval     positive
## 35071              time anticipation
## 35072            action     positive
## 35073           contact     positive
## 35074              joke     negative
## 35075        retirement anticipation
## 35076        retirement         fear
## 35077        retirement          joy
## 35078        retirement     negative
## 35079        retirement     positive
## 35080        retirement      sadness
## 35081        retirement        trust
## 35082          majority          joy
## 35083          majority     positive
## 35084          majority        trust
## 35085              bank        trust
## 35086          accounts        trust
## 35087         unlimited     positive
## 35088            change         fear
## 35089           protect     positive
## 35090              bank        trust
## 35091           reserve     positive
## 35092           foreign     negative
## 35093               don     positive
## 35094               don        trust
## 35095             trust        trust
## 35096             honor     positive
## 35097             honor        trust
## 35098             crash         fear
## 35099             crash     negative
## 35100             crash      sadness
## 35101             crash     surprise
## 35102             crash         fear
## 35103             crash     negative
## 35104             crash      sadness
## 35105             crash     surprise
## 35106              love          joy
## 35107              love     positive
## 35108             crash         fear
## 35109             crash     negative
## 35110             crash      sadness
## 35111             crash     surprise
## 35112            afford     positive
## 35113            demand        anger
## 35114            demand     negative
## 35115            supply     positive
## 35116     vulnerability         fear
## 35117     vulnerability     negative
## 35118     vulnerability      sadness
## 35119               don     positive
## 35120               don        trust
## 35121              time anticipation
## 35122             money        anger
## 35123             money anticipation
## 35124             money          joy
## 35125             money     positive
## 35126             money     surprise
## 35127             money        trust
## 35128            demand        anger
## 35129            demand     negative
## 35130          majority          joy
## 35131          majority     positive
## 35132          majority        trust
## 35133            marked     positive
## 35134            happen anticipation
## 35135             learn     positive
## 35136         resources          joy
## 35137         resources     positive
## 35138         resources        trust
## 35139             learn     positive
## 35140             money        anger
## 35141             money anticipation
## 35142             money          joy
## 35143             money     positive
## 35144             money     surprise
## 35145             money        trust
## 35146            demand        anger
## 35147            demand     negative
## 35148              bank        trust
## 35149              hide         fear
## 35150              time anticipation
## 35151             extra     positive
## 35152            extend     positive
## 35153           knowing     positive
## 35154            happen anticipation
## 35155           knowing     positive
## 35156             weird      disgust
## 35157             weird     negative
## 35158        government         fear
## 35159        government     negative
## 35160           content          joy
## 35161           content     positive
## 35162           content        trust
## 35163        convenient     positive
## 35164               bad        anger
## 35165               bad      disgust
## 35166               bad         fear
## 35167               bad     negative
## 35168               bad      sadness
## 35169           savings     positive
## 35170              baby          joy
## 35171              baby     positive
## 35172          accounts        trust
## 35173             money        anger
## 35174             money anticipation
## 35175             money          joy
## 35176             money     positive
## 35177             money     surprise
## 35178             money        trust
## 35179             usual     positive
## 35180             usual        trust
## 35181          majority          joy
## 35182          majority     positive
## 35183          majority        trust
## 35184           feeling        anger
## 35185           feeling anticipation
## 35186           feeling      disgust
## 35187           feeling         fear
## 35188           feeling          joy
## 35189           feeling     negative
## 35190           feeling     positive
## 35191           feeling      sadness
## 35192           feeling     surprise
## 35193           feeling        trust
## 35194              time anticipation
## 35195        microscope        trust
## 35196              time anticipation
## 35197         breakfast     positive
## 35198            change         fear
## 35199              talk     positive
## 35200             worth     positive
## 35201             alive anticipation
## 35202             alive          joy
## 35203             alive     positive
## 35204             alive        trust
## 35205           glacial     negative
## 35206            lowest     negative
## 35207            lowest      sadness
## 35208            action     positive
## 35209           contact     positive
## 35210     unprecedented     surprise
## 35211            sudden     surprise
## 35212              food          joy
## 35213              food     positive
## 35214              food        trust
## 35215          collapse      disgust
## 35216          collapse         fear
## 35217          collapse     negative
## 35218          collapse      sadness
## 35219           warning         fear
## 35220              hate        anger
## 35221              hate      disgust
## 35222              hate         fear
## 35223              hate     negative
## 35224              hate      sadness
## 35225            change         fear
## 35226             worry anticipation
## 35227             worry         fear
## 35228             worry     negative
## 35229             worry      sadness
## 35230              wild     negative
## 35231              wild     surprise
## 35232          vendetta        anger
## 35233          vendetta         fear
## 35234          vendetta     negative
## 35235          vendetta      sadness
## 35236             forge     positive
## 35237             worse         fear
## 35238             worse     negative
## 35239             worse      sadness
## 35240            damage        anger
## 35241            damage      disgust
## 35242            damage     negative
## 35243            damage      sadness
## 35244              mate     positive
## 35245              mate        trust
## 35246            nation        trust
## 35247          collapse      disgust
## 35248          collapse         fear
## 35249          collapse     negative
## 35250          collapse      sadness
## 35251            theory anticipation
## 35252            theory        trust
## 35253          collapse      disgust
## 35254          collapse         fear
## 35255          collapse     negative
## 35256          collapse      sadness
## 35257            theory anticipation
## 35258            theory        trust
## 35259         resources          joy
## 35260         resources     positive
## 35261         resources        trust
## 35262              lack     negative
## 35263           ability     positive
## 35264            remake     positive
## 35265         difficult         fear
## 35266         resources          joy
## 35267         resources     positive
## 35268         resources        trust
## 35269               cry     negative
## 35270               cry      sadness
## 35271       instinctive        anger
## 35272       instinctive      disgust
## 35273       instinctive         fear
## 35274       instinctive     positive
## 35275            losing        anger
## 35276            losing     negative
## 35277            losing      sadness
## 35278      intelligence         fear
## 35279      intelligence          joy
## 35280      intelligence     positive
## 35281      intelligence        trust
## 35282              base        trust
## 35283             teach          joy
## 35284             teach     positive
## 35285             teach     surprise
## 35286             teach        trust
## 35287            hooked     negative
## 35288              rock     positive
## 35289             slime      disgust
## 35290              dirt      disgust
## 35291              dirt     negative
## 35292          majority          joy
## 35293          majority     positive
## 35294          majority        trust
## 35295               don     positive
## 35296               don        trust
## 35297               mad        anger
## 35298               mad      disgust
## 35299               mad         fear
## 35300               mad     negative
## 35301               mad      sadness
## 35302          collapse      disgust
## 35303          collapse         fear
## 35304          collapse     negative
## 35305          collapse      sadness
## 35306              time anticipation
## 35307              time anticipation
## 35308             start anticipation
## 35309          collapse      disgust
## 35310          collapse         fear
## 35311          collapse     negative
## 35312          collapse      sadness
## 35313        horrifying      disgust
## 35314        horrifying         fear
## 35315        horrifying     negative
## 35316        horrifying      sadness
## 35317        exacerbate     negative
## 35318         advantage     positive
## 35319          collapse      disgust
## 35320          collapse         fear
## 35321          collapse     negative
## 35322          collapse      sadness
## 35323        cultivated     positive
## 35324               mad        anger
## 35325               mad      disgust
## 35326               mad         fear
## 35327               mad     negative
## 35328               mad      sadness
## 35329           ancient     negative
## 35330           ancient     negative
## 35331            losing        anger
## 35332            losing     negative
## 35333            losing      sadness
## 35334      intelligence         fear
## 35335      intelligence          joy
## 35336      intelligence     positive
## 35337      intelligence        trust
## 35338       instinctive        anger
## 35339       instinctive      disgust
## 35340       instinctive         fear
## 35341       instinctive     positive
## 35342          majority          joy
## 35343          majority     positive
## 35344          majority        trust
## 35345       complicated     negative
## 35346           mimicry     negative
## 35347           mimicry     surprise
## 35348         improvise anticipation
## 35349         improvise     positive
## 35350         improvise     surprise
## 35351               sea     positive
## 35352             level     positive
## 35353             level        trust
## 35354               sea     positive
## 35355            insane        anger
## 35356            insane         fear
## 35357            insane     negative
## 35358           refugee      sadness
## 35359            crisis     negative
## 35360              fair     positive
## 35361            expect anticipation
## 35362            expect     positive
## 35363            expect     surprise
## 35364            expect        trust
## 35365              time anticipation
## 35366          educated     positive
## 35367          politics        anger
## 35368            manage     positive
## 35369            manage        trust
## 35370              time anticipation
## 35371               job     positive
## 35372            expect anticipation
## 35373            expect     positive
## 35374            expect     surprise
## 35375            expect        trust
## 35376               bad        anger
## 35377               bad      disgust
## 35378               bad         fear
## 35379               bad     negative
## 35380               bad      sadness
## 35381              shot        anger
## 35382              shot         fear
## 35383              shot     negative
## 35384              shot      sadness
## 35385              shot     surprise
## 35386        government         fear
## 35387        government     negative
## 35388          conserve     positive
## 35389         resources          joy
## 35390         resources     positive
## 35391         resources        trust
## 35392         democracy     positive
## 35393        population     positive
## 35394            secret        trust
## 35395            police         fear
## 35396            police     positive
## 35397            police        trust
## 35398               sun anticipation
## 35399               sun          joy
## 35400               sun     positive
## 35401               sun     surprise
## 35402               sun        trust
## 35403              true          joy
## 35404              true     positive
## 35405              true        trust
## 35406              fear        anger
## 35407              fear         fear
## 35408              fear     negative
## 35409         socialism      disgust
## 35410         socialism         fear
## 35411             fault     negative
## 35412             fault      sadness
## 35413          military         fear
## 35414            effort     positive
## 35415            tackle        anger
## 35416            tackle     surprise
## 35417            change         fear
## 35418        government         fear
## 35419        government     negative
## 35420          electric          joy
## 35421          electric     positive
## 35422          electric     surprise
## 35423             green          joy
## 35424             green     positive
## 35425             green        trust
## 35426        ultimately anticipation
## 35427        ultimately     positive
## 35428            afford     positive
## 35429           healthy     positive
## 35430          alarming         fear
## 35431          alarming     negative
## 35432          alarming     surprise
## 35433              late     negative
## 35434              late      sadness
## 35435             fault     negative
## 35436             fault      sadness
## 35437            victim        anger
## 35438            victim         fear
## 35439            victim     negative
## 35440            victim      sadness
## 35441            system        trust
## 35442          electric          joy
## 35443          electric     positive
## 35444          electric     surprise
## 35445             green          joy
## 35446             green     positive
## 35447             green        trust
## 35448              save          joy
## 35449              save     positive
## 35450              save        trust
## 35451            scarce         fear
## 35452            scarce     negative
## 35453            scarce      sadness
## 35454         resources          joy
## 35455         resources     positive
## 35456         resources        trust
## 35457             green          joy
## 35458             green     positive
## 35459             green        trust
## 35460        government         fear
## 35461        government     negative
## 35462             fault     negative
## 35463             fault      sadness
## 35464            system        trust
## 35465            pretty anticipation
## 35466            pretty          joy
## 35467            pretty     positive
## 35468            pretty        trust
## 35469        impossible     negative
## 35470        impossible      sadness
## 35471             agree     positive
## 35472             blame        anger
## 35473             blame      disgust
## 35474             blame     negative
## 35475             fault     negative
## 35476             fault      sadness
## 35477            victim        anger
## 35478            victim         fear
## 35479            victim     negative
## 35480            victim      sadness
## 35481            system        trust
## 35482            change         fear
## 35483              dare anticipation
## 35484              dare        trust
## 35485            victim        anger
## 35486            victim         fear
## 35487            victim     negative
## 35488            victim      sadness
## 35489            system        trust
## 35490            victim        anger
## 35491            victim         fear
## 35492            victim     negative
## 35493            victim      sadness
## 35494            change         fear
## 35495             awful        anger
## 35496             awful      disgust
## 35497             awful         fear
## 35498             awful     negative
## 35499             awful      sadness
## 35500            scream        anger
## 35501            scream      disgust
## 35502            scream         fear
## 35503            scream     negative
## 35504            scream     surprise
## 35505            bloody        anger
## 35506            bloody      disgust
## 35507            bloody         fear
## 35508            bloody     negative
## 35509            bloody      sadness
## 35510            murder        anger
## 35511            murder      disgust
## 35512            murder         fear
## 35513            murder     negative
## 35514            murder      sadness
## 35515            murder     surprise
## 35516              slap        anger
## 35517              slap     negative
## 35518              slap     surprise
## 35519               tax     negative
## 35520               tax      sadness
## 35521            public anticipation
## 35522            public     positive
## 35523          innocent     positive
## 35524          innocent        trust
## 35525            system        trust
## 35526            change         fear
## 35527            change         fear
## 35528            change         fear
## 35529          helpless         fear
## 35530          helpless     negative
## 35531          helpless      sadness
## 35532            crying     negative
## 35533            crying      sadness
## 35534        resistance        anger
## 35535        resistance     negative
## 35536            change         fear
## 35537         passivity     negative
## 35538             naive     negative
## 35539        capitalist     positive
## 35540            system        trust
## 35541              late     negative
## 35542              late      sadness
## 35543           passive     negative
## 35544          isolated         fear
## 35545          isolated     negative
## 35546          isolated      sadness
## 35547             agree     positive
## 35548              lost     negative
## 35549              lost      sadness
## 35550              hope anticipation
## 35551              hope          joy
## 35552              hope     positive
## 35553              hope     surprise
## 35554              hope        trust
## 35555             start anticipation
## 35556           failure      disgust
## 35557           failure         fear
## 35558           failure     negative
## 35559           failure      sadness
## 35560         advantage     positive
## 35561        government         fear
## 35562        government     negative
## 35563             dying        anger
## 35564             dying      disgust
## 35565             dying         fear
## 35566             dying     negative
## 35567             dying      sadness
## 35568            unable     negative
## 35569            unable      sadness
## 35570            ground        trust
## 35571            pretty anticipation
## 35572            pretty          joy
## 35573            pretty     positive
## 35574            pretty        trust
## 35575         advantage     positive
## 35576            extend     positive
## 35577             dying        anger
## 35578             dying      disgust
## 35579             dying         fear
## 35580             dying     negative
## 35581             dying      sadness
## 35582            change         fear
## 35583       destruction        anger
## 35584       destruction     negative
## 35585        inequality        anger
## 35586        inequality         fear
## 35587        inequality     negative
## 35588        inequality      sadness
## 35589        production anticipation
## 35590        production     positive
## 35591         terrorism        anger
## 35592         terrorism      disgust
## 35593         terrorism         fear
## 35594         terrorism     negative
## 35595         terrorism      sadness
## 35596              lack     negative
## 35597           erosion     negative
## 35598        ultimately anticipation
## 35599        ultimately     positive
## 35600       convenience     positive
## 35601       convenience     positive
## 35602             model     positive
## 35603         ownership     positive
## 35604          personal        trust
## 35605             focus     positive
## 35606            public anticipation
## 35607            public     positive
## 35608             build     positive
## 35609            garden          joy
## 35610            garden     positive
## 35611         willingly     positive
## 35612       experienced     positive
## 35613       experienced        trust
## 35614       electricity     positive
## 35615          delusion        anger
## 35616          delusion         fear
## 35617          delusion     negative
## 35618          delusion      sadness
## 35619         willingly     positive
## 35620        productive     positive
## 35621           provide     positive
## 35622           provide        trust
## 35623           magical anticipation
## 35624           magical          joy
## 35625           magical     positive
## 35626           magical     surprise
## 35627         including     positive
## 35628            public anticipation
## 35629            public     positive
## 35630            system        trust
## 35631            broken        anger
## 35632            broken         fear
## 35633            broken     negative
## 35634            broken      sadness
## 35635            system        trust
## 35636              land     positive
## 35637              grow anticipation
## 35638              grow          joy
## 35639              grow     positive
## 35640              grow        trust
## 35641              food          joy
## 35642              food     positive
## 35643              food        trust
## 35644       electricity     positive
## 35645            public anticipation
## 35646            public     positive
## 35647        capitalist     positive
## 35648            system        trust
## 35649           measure        trust
## 35650           ethical     positive
## 35651            choice     positive
## 35652           suicide        anger
## 35653           suicide         fear
## 35654           suicide     negative
## 35655           suicide      sadness
## 35656            fellow     positive
## 35657            fellow        trust
## 35658           survive     positive
## 35659       responsible     positive
## 35660       responsible        trust
## 35661              time anticipation
## 35662         essential     positive
## 35663           journey anticipation
## 35664           journey         fear
## 35665           journey          joy
## 35666           journey     positive
## 35667               eat     positive
## 35668            larger      disgust
## 35669            larger     surprise
## 35670            larger        trust
## 35671            damage        anger
## 35672            damage      disgust
## 35673            damage     negative
## 35674            damage      sadness
## 35675     uncomfortable     negative
## 35676            public anticipation
## 35677            public     positive
## 35678             waste      disgust
## 35679             waste     negative
## 35680        acceptable     positive
## 35681         resources          joy
## 35682         resources     positive
## 35683         resources        trust
## 35684             sense     positive
## 35685             agree     positive
## 35686          majority          joy
## 35687          majority     positive
## 35688          majority        trust
## 35689             worse         fear
## 35690             worse     negative
## 35691             worse      sadness
## 35692             major     positive
## 35693             waste      disgust
## 35694             waste     negative
## 35695              hope anticipation
## 35696              hope          joy
## 35697              hope     positive
## 35698              hope     surprise
## 35699              hope        trust
## 35700              hope anticipation
## 35701              hope          joy
## 35702              hope     positive
## 35703              hope     surprise
## 35704              hope        trust
## 35705       frustration        anger
## 35706       frustration     negative
## 35707              hope anticipation
## 35708              hope          joy
## 35709              hope     positive
## 35710              hope     surprise
## 35711              hope        trust
## 35712        production anticipation
## 35713        production     positive
## 35714             cheap     negative
## 35715            luxury          joy
## 35716            luxury     positive
## 35717              deny        anger
## 35718              deny     negative
## 35719          continue anticipation
## 35720          continue     positive
## 35721          continue        trust
## 35722           selfish        anger
## 35723           selfish      disgust
## 35724           selfish     negative
## 35725          electric          joy
## 35726          electric     positive
## 35727          electric     surprise
## 35728       electricity     positive
## 35729              time anticipation
## 35730          electric          joy
## 35731          electric     positive
## 35732          electric     surprise
## 35733             crash         fear
## 35734             crash     negative
## 35735             crash      sadness
## 35736             crash     surprise
## 35737           survive     positive
## 35738             crash         fear
## 35739             crash     negative
## 35740             crash      sadness
## 35741             crash     surprise
## 35742           barrier        anger
## 35743           barrier     negative
## 35744          customer     positive
## 35745             start anticipation
## 35746            weight anticipation
## 35747            weight      disgust
## 35748            weight         fear
## 35749            weight          joy
## 35750            weight     negative
## 35751            weight     positive
## 35752            weight      sadness
## 35753            weight     surprise
## 35754            weight        trust
## 35755             fault     negative
## 35756             fault      sadness
## 35757            system        trust
## 35758             blame        anger
## 35759             blame      disgust
## 35760             blame     negative
## 35761             blame        anger
## 35762             blame      disgust
## 35763             blame     negative
## 35764             angry        anger
## 35765             angry      disgust
## 35766             angry     negative
## 35767     uncomfortable     negative
## 35768         including     positive
## 35769           illegal        anger
## 35770           illegal      disgust
## 35771           illegal         fear
## 35772           illegal     negative
## 35773           illegal      sadness
## 35774          standing     positive
## 35775          pavement        trust
## 35776             fault     negative
## 35777             fault      sadness
## 35778             force        anger
## 35779             force         fear
## 35780             force     negative
## 35781            change         fear
## 35782            change         fear
## 35783       electricity     positive
## 35784            actual     positive
## 35785             lower     negative
## 35786             lower      sadness
## 35787             cheap     negative
## 35788             cheap     negative
## 35789            demand        anger
## 35790            demand     negative
## 35791            supply     positive
## 35792       electricity     positive
## 35793        impossible     negative
## 35794        impossible      sadness
## 35795            actual     positive
## 35796        production anticipation
## 35797        production     positive
## 35798           battery        anger
## 35799           battery     negative
## 35800         resources          joy
## 35801         resources     positive
## 35802         resources        trust
## 35803              save          joy
## 35804              save     positive
## 35805              save        trust
## 35806           battery        anger
## 35807           battery     negative
## 35808            offset anticipation
## 35809            offset     positive
## 35810              fair     positive
## 35811           savings     positive
## 35812           battery        anger
## 35813           battery     negative
## 35814             clock anticipation
## 35815       electricity     positive
## 35816         advantage     positive
## 35817         poisonous        anger
## 35818         poisonous      disgust
## 35819         poisonous         fear
## 35820         poisonous     negative
## 35821         poisonous      sadness
## 35822              shed     negative
## 35823              dust     negative
## 35824            forget     negative
## 35825           exhaust     negative
## 35826              ship anticipation
## 35827            refine     positive
## 35828             swear     positive
## 35829             swear        trust
## 35830         arguments        anger
## 35831           perfect anticipation
## 35832           perfect          joy
## 35833           perfect     positive
## 35834           perfect        trust
## 35835           perfect anticipation
## 35836           perfect          joy
## 35837           perfect     positive
## 35838           perfect        trust
## 35839             enemy        anger
## 35840             enemy      disgust
## 35841             enemy         fear
## 35842             enemy     negative
## 35843            scarce         fear
## 35844            scarce     negative
## 35845            scarce      sadness
## 35846            damage        anger
## 35847            damage      disgust
## 35848            damage     negative
## 35849            damage      sadness
## 35850             sadly     negative
## 35851             sadly      sadness
## 35852             wrong     negative
## 35853             sadly     negative
## 35854             sadly      sadness
## 35855             fault     negative
## 35856             fault      sadness
## 35857          military         fear
## 35858            effort     positive
## 35859            tackle        anger
## 35860            tackle     surprise
## 35861            change         fear
## 35862        government         fear
## 35863        government     negative
## 35864          electric          joy
## 35865          electric     positive
## 35866          electric     surprise
## 35867             green          joy
## 35868             green     positive
## 35869             green        trust
## 35870        ultimately anticipation
## 35871        ultimately     positive
## 35872            afford     positive
## 35873             agree     positive
## 35874            create          joy
## 35875            create     positive
## 35876             focus     positive
## 35877             start anticipation
## 35878             usual     positive
## 35879             usual        trust
## 35880          electric          joy
## 35881          electric     positive
## 35882          electric     surprise
## 35883            public anticipation
## 35884            public     positive
## 35885          shopping anticipation
## 35886          shopping          joy
## 35887          shopping     positive
## 35888          shopping     surprise
## 35889          shopping        trust
## 35890          prepared anticipation
## 35891          prepared     positive
## 35892          prepared        trust
## 35893           heavily     negative
## 35894             fussy      disgust
## 35895             fussy     negative
## 35896               eat     positive
## 35897             cheap     negative
## 35898              time anticipation
## 35899           forward     positive
## 35900              food          joy
## 35901              food     positive
## 35902              food        trust
## 35903           fragile         fear
## 35904           fragile     negative
## 35905           fragile      sadness
## 35906               die         fear
## 35907               die     negative
## 35908               die      sadness
## 35909        completely     positive
## 35910            doomed         fear
## 35911            doomed     negative
## 35912            doomed      sadness
## 35913         petroleum      disgust
## 35914         petroleum     negative
## 35915         petroleum     positive
## 35916             smash        anger
## 35917             smash         fear
## 35918             smash     negative
## 35919        government         fear
## 35920        government     negative
## 35921            proven        trust
## 35922        government         fear
## 35923        government     negative
## 35924            bother     negative
## 35925              fire         fear
## 35926            strike        anger
## 35927            strike     negative
## 35928          humanity          joy
## 35929          humanity     positive
## 35930          humanity        trust
## 35931         volunteer anticipation
## 35932         volunteer         fear
## 35933         volunteer          joy
## 35934         volunteer     positive
## 35935         volunteer        trust
## 35936              lost     negative
## 35937              lost      sadness
## 35938           default      disgust
## 35939           default         fear
## 35940           default     negative
## 35941           default      sadness
## 35942             shell        anger
## 35943             shell         fear
## 35944             shell     negative
## 35945             shell      sadness
## 35946             shell     surprise
## 35947          increase     positive
## 35948              dare anticipation
## 35949              dare        trust
## 35950          complain        anger
## 35951          complain     negative
## 35952          complain      sadness
## 35953             truth     positive
## 35954             truth        trust
## 35955            unfair        anger
## 35956            unfair      disgust
## 35957            unfair     negative
## 35958            unfair      sadness
## 35959            change         fear
## 35960             chase     negative
## 35961               hit        anger
## 35962               hit     negative
## 35963             pivot     positive
## 35964             pivot        trust
## 35965             green          joy
## 35966             green     positive
## 35967             green        trust
## 35968         existence     positive
## 35969             shell        anger
## 35970             shell         fear
## 35971             shell     negative
## 35972             shell      sadness
## 35973             shell     surprise
## 35974        discussion     positive
## 35975             shell        anger
## 35976             shell         fear
## 35977             shell     negative
## 35978             shell      sadness
## 35979             shell     surprise
## 35980          collapse      disgust
## 35981          collapse         fear
## 35982          collapse     negative
## 35983          collapse      sadness
## 35984      civilization     positive
## 35985      civilization        trust
## 35986          punished        anger
## 35987          punished anticipation
## 35988          punished      disgust
## 35989          punished         fear
## 35990          punished     negative
## 35991          punished      sadness
## 35992            public anticipation
## 35993            public     positive
## 35994         execution        anger
## 35995         execution         fear
## 35996         execution     negative
## 35997         execution      sadness
## 35998         execution        trust
## 35999              core     positive
## 36000          argument        anger
## 36001          argument     negative
## 36002           illegal        anger
## 36003           illegal      disgust
## 36004           illegal         fear
## 36005           illegal     negative
## 36006           illegal      sadness
## 36007           horrors         fear
## 36008           horrors     negative
## 36009           horrors      sadness
## 36010         essential     positive
## 36011            ignore     negative
## 36012              shit        anger
## 36013              shit      disgust
## 36014              shit     negative
## 36015              claw        anger
## 36016              claw         fear
## 36017              claw     negative
## 36018        punishment        anger
## 36019        punishment      disgust
## 36020        punishment         fear
## 36021        punishment     negative
## 36022         execution        anger
## 36023         execution         fear
## 36024         execution     negative
## 36025         execution      sadness
## 36026         execution        trust
## 36027        complicity     negative
## 36028        complicity     positive
## 36029            purely     positive
## 36030            purely        trust
## 36031           survive     positive
## 36032          personal        trust
## 36033            reward anticipation
## 36034            reward          joy
## 36035            reward     positive
## 36036            reward     surprise
## 36037            reward        trust
## 36038          violence        anger
## 36039          violence         fear
## 36040          violence     negative
## 36041          violence      sadness
## 36042               ban     negative
## 36043            pretty anticipation
## 36044            pretty          joy
## 36045            pretty     positive
## 36046            pretty        trust
## 36047           refugee      sadness
## 36048             weird      disgust
## 36049             weird     negative
## 36050             shell        anger
## 36051             shell         fear
## 36052             shell     negative
## 36053             shell      sadness
## 36054             shell     surprise
## 36055        ultimately anticipation
## 36056        ultimately     positive
## 36057          enjoying anticipation
## 36058          enjoying          joy
## 36059          enjoying     positive
## 36060          enjoying        trust
## 36061          majority          joy
## 36062          majority     positive
## 36063          majority        trust
## 36064            change         fear
## 36065             shell        anger
## 36066             shell         fear
## 36067             shell     negative
## 36068             shell      sadness
## 36069             shell     surprise
## 36070               fun anticipation
## 36071               fun          joy
## 36072               fun     positive
## 36073            option     positive
## 36074            option     positive
## 36075            unfair        anger
## 36076            unfair      disgust
## 36077            unfair     negative
## 36078            unfair      sadness
## 36079              real     positive
## 36080              real        trust
## 36081             build     positive
## 36082        government         fear
## 36083        government     negative
## 36084        scientific     positive
## 36085        scientific        trust
## 36086          forecast anticipation
## 36087          forecast        trust
## 36088              hell        anger
## 36089              hell      disgust
## 36090              hell         fear
## 36091              hell     negative
## 36092              hell      sadness
## 36093            public anticipation
## 36094            public     positive
## 36095          increase     positive
## 36096             build     positive
## 36097         dependent     negative
## 36098         dependent     positive
## 36099         dependent        trust
## 36100             agree     positive
## 36101            hiding         fear
## 36102            victim        anger
## 36103            victim         fear
## 36104            victim     negative
## 36105            victim      sadness
## 36106             broke         fear
## 36107             broke     negative
## 36108             broke      sadness
## 36109           urgency anticipation
## 36110           urgency         fear
## 36111           urgency     surprise
## 36112            danger         fear
## 36113            danger     negative
## 36114            danger      sadness
## 36115            school        trust
## 36116           airport anticipation
## 36117             break     surprise
## 36118            forget     negative
## 36119          absolute     positive
## 36120              fill        trust
## 36121              pool     positive
## 36122             leave     negative
## 36123             leave      sadness
## 36124             leave     surprise
## 36125           perfect anticipation
## 36126           perfect          joy
## 36127           perfect     positive
## 36128           perfect        trust
## 36129               die         fear
## 36130               die     negative
## 36131               die      sadness
## 36132            expect anticipation
## 36133            expect     positive
## 36134            expect     surprise
## 36135            expect        trust
## 36136            excess     negative
## 36137            expect anticipation
## 36138            expect     positive
## 36139            expect     surprise
## 36140            expect        trust
## 36141          ministry          joy
## 36142          ministry     positive
## 36143          ministry        trust
## 36144           killing        anger
## 36145           killing         fear
## 36146           killing     negative
## 36147           killing      sadness
## 36148          engaging          joy
## 36149          engaging     positive
## 36150          engaging        trust
## 36151            abrupt     surprise
## 36152             weird      disgust
## 36153             weird     negative
## 36154       theoretical     positive
## 36155        transcript        trust
## 36156            father        trust
## 36157             spent     negative
## 36158             visit     positive
## 36159          violence        anger
## 36160          violence         fear
## 36161          violence     negative
## 36162          violence      sadness
## 36163            afraid         fear
## 36164            afraid     negative
## 36165           improve anticipation
## 36166           improve          joy
## 36167           improve     positive
## 36168           improve        trust
## 36169            happen anticipation
## 36170              time anticipation
## 36171            coming anticipation
## 36172               mad        anger
## 36173               mad      disgust
## 36174               mad         fear
## 36175               mad     negative
## 36176               mad      sadness
## 36177               mad        anger
## 36178               mad      disgust
## 36179               mad         fear
## 36180               mad     negative
## 36181               mad      sadness
## 36182            attack        anger
## 36183            attack         fear
## 36184            attack     negative
## 36185               mad        anger
## 36186               mad      disgust
## 36187               mad         fear
## 36188               mad     negative
## 36189               mad      sadness
## 36190            father        trust
## 36191             moral        anger
## 36192             moral     positive
## 36193             moral        trust
## 36194           madness        anger
## 36195           madness         fear
## 36196           madness     negative
## 36197             enjoy anticipation
## 36198             enjoy          joy
## 36199             enjoy     positive
## 36200             enjoy        trust
## 36201            danger         fear
## 36202            danger     negative
## 36203            danger      sadness
## 36204              real     positive
## 36205              real        trust
## 36206        sacrifices      disgust
## 36207        sacrifices         fear
## 36208        sacrifices     negative
## 36209        sacrifices      sadness
## 36210           kicking        anger
## 36211               pay anticipation
## 36212               pay          joy
## 36213               pay     positive
## 36214               pay        trust
## 36215         abundance anticipation
## 36216         abundance      disgust
## 36217         abundance          joy
## 36218         abundance     negative
## 36219         abundance     positive
## 36220         abundance        trust
## 36221            actual     positive
## 36222              worn     negative
## 36223              worn      sadness
## 36224        revolution        anger
## 36225        revolution anticipation
## 36226        revolution         fear
## 36227        revolution     negative
## 36228        revolution     positive
## 36229        revolution      sadness
## 36230        revolution     surprise
## 36231            pretty anticipation
## 36232            pretty          joy
## 36233            pretty     positive
## 36234            pretty        trust
## 36235         effective     positive
## 36236         effective        trust
## 36237       elimination        anger
## 36238       elimination      disgust
## 36239       elimination         fear
## 36240       elimination     negative
## 36241       elimination      sadness
## 36242              fair     positive
## 36243              true          joy
## 36244              true     positive
## 36245              true        trust
## 36246      architecture        trust
## 36247             build     positive
## 36248               top anticipation
## 36249               top     positive
## 36250               top        trust
## 36251              main     positive
## 36252           network anticipation
## 36253           network anticipation
## 36254             frank     positive
## 36255             frank        trust
## 36256       catastrophe        anger
## 36257       catastrophe      disgust
## 36258       catastrophe         fear
## 36259       catastrophe     negative
## 36260       catastrophe      sadness
## 36261       catastrophe     surprise
## 36262              wild     negative
## 36263              wild     surprise
## 36264         impending anticipation
## 36265         impending         fear
## 36266              doom         fear
## 36267              doom     negative
## 36268              time anticipation
## 36269            growth     positive
## 36270        government         fear
## 36271        government     negative
## 36272            system        trust
## 36273          increase     positive
## 36274        assessment     surprise
## 36275        assessment        trust
## 36276             lower     negative
## 36277             lower      sadness
## 36278             worse         fear
## 36279             worse     negative
## 36280             worse      sadness
## 36281               bad        anger
## 36282               bad      disgust
## 36283               bad         fear
## 36284               bad     negative
## 36285               bad      sadness
## 36286              king     positive
## 36287            chance     surprise
## 36288           neutral anticipation
## 36289           neutral        trust
## 36290          increase     positive
## 36291            august     positive
## 36292         producing     positive
## 36293            expert     positive
## 36294            expert        trust
## 36295        assessment     surprise
## 36296        assessment        trust
## 36297           prepare anticipation
## 36298           prepare     positive
## 36299           drought     negative
## 36300           respite          joy
## 36301           respite     positive
## 36302           respite        trust
## 36303           drought     negative
## 36304           related        trust
## 36305              safe          joy
## 36306              safe     positive
## 36307              safe        trust
## 36308              time anticipation
## 36309           prevent         fear
## 36310             start anticipation
## 36311             money        anger
## 36312             money anticipation
## 36313             money          joy
## 36314             money     positive
## 36315             money     surprise
## 36316             money        trust
## 36317        technology     positive
## 36318              wait anticipation
## 36319              wait     negative
## 36320               tax     negative
## 36321               tax      sadness
## 36322              shit        anger
## 36323              shit      disgust
## 36324              shit     negative
## 36325              glad anticipation
## 36326              glad          joy
## 36327              glad     positive
## 36328        government         fear
## 36329        government     negative
## 36330            pledge          joy
## 36331            pledge     positive
## 36332            pledge        trust
## 36333          absolute     positive
## 36334              tree        anger
## 36335              tree anticipation
## 36336              tree      disgust
## 36337              tree          joy
## 36338              tree     positive
## 36339              tree     surprise
## 36340              tree        trust
## 36341           reading     positive
## 36342          horrible        anger
## 36343          horrible      disgust
## 36344          horrible         fear
## 36345          horrible     negative
## 36346              fire         fear
## 36347             enjoy anticipation
## 36348             enjoy          joy
## 36349             enjoy     positive
## 36350             enjoy        trust
## 36351             peace anticipation
## 36352             peace          joy
## 36353             peace     positive
## 36354             peace        trust
## 36355              kick        anger
## 36356              kick     negative
## 36357              numb     negative
## 36358             enjoy anticipation
## 36359             enjoy          joy
## 36360             enjoy     positive
## 36361             enjoy        trust
## 36362               top anticipation
## 36363               top     positive
## 36364               top        trust
## 36365              kill         fear
## 36366              kill     negative
## 36367              kill      sadness
## 36368         including     positive
## 36369          fighting        anger
## 36370          fighting     negative
## 36371              time anticipation
## 36372             enjoy anticipation
## 36373             enjoy          joy
## 36374             enjoy     positive
## 36375             enjoy        trust
## 36376            horror        anger
## 36377            horror      disgust
## 36378            horror         fear
## 36379            horror     negative
## 36380            horror      sadness
## 36381            horror     surprise
## 36382           knowing     positive
## 36383            choice     positive
## 36384           pretend     negative
## 36385       catastrophe        anger
## 36386       catastrophe      disgust
## 36387       catastrophe         fear
## 36388       catastrophe     negative
## 36389       catastrophe      sadness
## 36390       catastrophe     surprise
## 36391          humanity          joy
## 36392          humanity     positive
## 36393          humanity        trust
## 36394         worthless        anger
## 36395         worthless      disgust
## 36396         worthless     negative
## 36397         worthless      sadness
## 36398             cliff         fear
## 36399               hit        anger
## 36400               hit     negative
## 36401            result anticipation
## 36402            change         fear
## 36403            coming anticipation
## 36404              cool     positive
## 36405            happen anticipation
## 36406            happen anticipation
## 36407             ahead     positive
## 36408              food          joy
## 36409              food     positive
## 36410              food        trust
## 36411              rest     positive
## 36412            famine     negative
## 36413            famine      sadness
## 36414           drought     negative
## 36415               war         fear
## 36416               war     negative
## 36417          shortage        anger
## 36418          shortage         fear
## 36419          shortage     negative
## 36420          shortage      sadness
## 36421              food          joy
## 36422              food     positive
## 36423              food        trust
## 36424             doubt         fear
## 36425             doubt     negative
## 36426             doubt      sadness
## 36427             doubt        trust
## 36428              hide         fear
## 36429         desperate     negative
## 36430               die         fear
## 36431               die     negative
## 36432               die      sadness
## 36433            pretty anticipation
## 36434            pretty          joy
## 36435            pretty     positive
## 36436            pretty        trust
## 36437              cold     negative
## 36438           comfort anticipation
## 36439           comfort          joy
## 36440           comfort     positive
## 36441           comfort        trust
## 36442              luck anticipation
## 36443              luck          joy
## 36444              luck     positive
## 36445              luck     surprise
## 36446         nightmare         fear
## 36447         nightmare     negative
## 36448            attack        anger
## 36449            attack         fear
## 36450            attack     negative
## 36451            chance     surprise
## 36452             doubt         fear
## 36453             doubt     negative
## 36454             doubt      sadness
## 36455             doubt        trust
## 36456             money        anger
## 36457             money anticipation
## 36458             money          joy
## 36459             money     positive
## 36460             money     surprise
## 36461             money        trust
## 36462         worthless        anger
## 36463         worthless      disgust
## 36464         worthless     negative
## 36465         worthless      sadness
## 36466              safe          joy
## 36467              safe     positive
## 36468              safe        trust
## 36469        protecting     positive
## 36470        protecting        trust
## 36471         resources          joy
## 36472         resources     positive
## 36473         resources        trust
## 36474              land     positive
## 36475              safe          joy
## 36476              safe     positive
## 36477              safe        trust
## 36478             chaos        anger
## 36479             chaos         fear
## 36480             chaos     negative
## 36481             chaos      sadness
## 36482              wont anticipation
## 36483     underestimate     surprise
## 36484             ready anticipation
## 36485              time anticipation
## 36486            bunker         fear
## 36487          fortress         fear
## 36488          fortress     positive
## 36489          fortress      sadness
## 36490          fortress        trust
## 36491       maintenance        trust
## 36492         resources          joy
## 36493         resources     positive
## 36494         resources        trust
## 36495           asshole        anger
## 36496           asshole      disgust
## 36497           asshole     negative
## 36498             treat        anger
## 36499             treat anticipation
## 36500             treat      disgust
## 36501             treat         fear
## 36502             treat          joy
## 36503             treat     negative
## 36504             treat     positive
## 36505             treat      sadness
## 36506             treat     surprise
## 36507             treat        trust
## 36508              wont anticipation
## 36509             money        anger
## 36510             money anticipation
## 36511             money          joy
## 36512             money     positive
## 36513             money     surprise
## 36514             money        trust
## 36515             money        anger
## 36516             money anticipation
## 36517             money          joy
## 36518             money     positive
## 36519             money     surprise
## 36520             money        trust
## 36521            banker        trust
## 36522              wont anticipation
## 36523            bunker         fear
## 36524              wont anticipation
## 36525         worthless        anger
## 36526         worthless      disgust
## 36527         worthless     negative
## 36528         worthless      sadness
## 36529              late     negative
## 36530              late      sadness
## 36531             worse         fear
## 36532             worse     negative
## 36533             worse      sadness
## 36534           cutting        anger
## 36535           cutting      disgust
## 36536           cutting         fear
## 36537           cutting     negative
## 36538           cutting      sadness
## 36539          tomorrow anticipation
## 36540           prevent         fear
## 36541          negative     negative
## 36542          negative      sadness
## 36543           cutting        anger
## 36544           cutting      disgust
## 36545           cutting         fear
## 36546           cutting     negative
## 36547           cutting      sadness
## 36548             beach          joy
## 36549           airport anticipation
## 36550              land     positive
## 36551               don     positive
## 36552               don        trust
## 36553              hope anticipation
## 36554              hope          joy
## 36555              hope     positive
## 36556              hope     surprise
## 36557              hope        trust
## 36558              cool     positive
## 36559              late     negative
## 36560              late      sadness
## 36561               tax     negative
## 36562               tax      sadness
## 36563              mill anticipation
## 36564               hot        anger
## 36565              cool     positive
## 36566            chilly     negative
## 36567         statement     positive
## 36568         statement        trust
## 36569         statement     positive
## 36570         statement        trust
## 36571          military         fear
## 36572             serve     negative
## 36573             serve        trust
## 36574            marine        trust
## 36575           related        trust
## 36576          collapse      disgust
## 36577          collapse         fear
## 36578          collapse     negative
## 36579          collapse      sadness
## 36580          disaster        anger
## 36581          disaster      disgust
## 36582          disaster         fear
## 36583          disaster     negative
## 36584          disaster      sadness
## 36585          disaster     surprise
## 36586         resources          joy
## 36587         resources     positive
## 36588         resources        trust
## 36589       destination anticipation
## 36590       destination         fear
## 36591       destination          joy
## 36592       destination     positive
## 36593       destination      sadness
## 36594       destination     surprise
## 36595               war         fear
## 36596               war     negative
## 36597          collapse      disgust
## 36598          collapse         fear
## 36599          collapse     negative
## 36600          collapse      sadness
## 36601              glad anticipation
## 36602              glad          joy
## 36603              glad     positive
## 36604           minimum     negative
## 36605        completely     positive
## 36606             elite anticipation
## 36607             elite          joy
## 36608             elite     positive
## 36609             elite        trust
## 36610               don     positive
## 36611               don        trust
## 36612             worry anticipation
## 36613             worry         fear
## 36614             worry     negative
## 36615             worry      sadness
## 36616            chance     surprise
## 36617             trump     surprise
## 36618            stupid     negative
## 36619            clever     positive
## 36620         including     positive
## 36621             virus     negative
## 36622               die         fear
## 36623               die     negative
## 36624               die      sadness
## 36625         infection         fear
## 36626         infection     negative
## 36627           chronic     negative
## 36628           chronic      sadness
## 36629              time anticipation
## 36630              time anticipation
## 36631            herpes      disgust
## 36632            herpes     negative
## 36633           chronic     negative
## 36634           chronic      sadness
## 36635               die         fear
## 36636               die     negative
## 36637               die      sadness
## 36638         infection         fear
## 36639         infection     negative
## 36640             worse         fear
## 36641             worse     negative
## 36642             worse      sadness
## 36643             worse         fear
## 36644             worse     negative
## 36645             worse      sadness
## 36646            cancer        anger
## 36647            cancer      disgust
## 36648            cancer         fear
## 36649            cancer     negative
## 36650            cancer      sadness
## 36651            friend          joy
## 36652            friend     positive
## 36653            friend        trust
## 36654              talk     positive
## 36655         statement     positive
## 36656         statement        trust
## 36657          military         fear
## 36658             serve     negative
## 36659             serve        trust
## 36660            marine        trust
## 36661           related        trust
## 36662          collapse      disgust
## 36663          collapse         fear
## 36664          collapse     negative
## 36665          collapse      sadness
## 36666          disaster        anger
## 36667          disaster      disgust
## 36668          disaster         fear
## 36669          disaster     negative
## 36670          disaster      sadness
## 36671          disaster     surprise
## 36672         resources          joy
## 36673         resources     positive
## 36674         resources        trust
## 36675       destination anticipation
## 36676       destination         fear
## 36677       destination          joy
## 36678       destination     positive
## 36679       destination      sadness
## 36680       destination     surprise
## 36681               war         fear
## 36682               war     negative
## 36683             clean          joy
## 36684             clean     positive
## 36685             clean        trust
## 36686           machine        trust
## 36687           machine        trust
## 36688            strive anticipation
## 36689         efficient anticipation
## 36690         efficient     positive
## 36691         efficient        trust
## 36692            income anticipation
## 36693            income          joy
## 36694            income     negative
## 36695            income     positive
## 36696            income      sadness
## 36697            income        trust
## 36698          supplies     positive
## 36699           machine        trust
## 36700               die         fear
## 36701               die     negative
## 36702               die      sadness
## 36703            change         fear
## 36704             focus     positive
## 36705             trump     surprise
## 36706               job     positive
## 36707          military         fear
## 36708         strategic     positive
## 36709          military         fear
## 36710          building     positive
## 36711         resources          joy
## 36712         resources     positive
## 36713         resources        trust
## 36714         anchorage     positive
## 36715         anchorage      sadness
## 36716              cold     negative
## 36717           missile         fear
## 36718           defense        anger
## 36719           defense anticipation
## 36720           defense         fear
## 36721           defense     positive
## 36722          presence     positive
## 36723          military         fear
## 36724            assets     positive
## 36725            assets     positive
## 36726             enjoy anticipation
## 36727             enjoy          joy
## 36728             enjoy     positive
## 36729             enjoy        trust
## 36730          question     positive
## 36731             money        anger
## 36732             money anticipation
## 36733             money          joy
## 36734             money     positive
## 36735             money     surprise
## 36736             money        trust
## 36737             spent     negative
## 36738           defense        anger
## 36739           defense anticipation
## 36740           defense         fear
## 36741           defense     positive
## 36742             spent     negative
## 36743              love          joy
## 36744              love     positive
## 36745            coming anticipation
## 36746            reason     positive
## 36747             visit     positive
## 36748             agree     positive
## 36749          collapse      disgust
## 36750          collapse         fear
## 36751          collapse     negative
## 36752          collapse      sadness
## 36753           symptom     negative
## 36754         explosive        anger
## 36755         explosive anticipation
## 36756         explosive         fear
## 36757         explosive     negative
## 36758         explosive     surprise
## 36759        completely     positive
## 36760             swamp      disgust
## 36761             swamp         fear
## 36762             swamp     negative
## 36763        impossible     negative
## 36764        impossible      sadness
## 36765             build     positive
## 36766               sea     positive
## 36767             level     positive
## 36768             level        trust
## 36769          expected anticipation
## 36770           minimum     negative
## 36771          unstable         fear
## 36772          unstable     negative
## 36773          unstable     surprise
## 36774        delusional        anger
## 36775        delusional         fear
## 36776        delusional     negative
## 36777              cold     negative
## 36778           explore anticipation
## 36779            coming anticipation
## 36780           crucial     positive
## 36781           crucial        trust
## 36782            change         fear
## 36783         essential     positive
## 36784             kudos          joy
## 36785             kudos     positive
## 36786          offering        trust
## 36787              hope anticipation
## 36788              hope          joy
## 36789              hope     positive
## 36790              hope     surprise
## 36791              hope        trust
## 36792            create          joy
## 36793            create     positive
## 36794             catch     surprise
## 36795           equally     positive
## 36796             truck        trust
## 36797            busted        anger
## 36798            busted         fear
## 36799            busted     negative
## 36800             worry anticipation
## 36801             worry         fear
## 36802             worry     negative
## 36803             worry      sadness
## 36804            expert     positive
## 36805            expert        trust
## 36806               bad        anger
## 36807               bad      disgust
## 36808               bad         fear
## 36809               bad     negative
## 36810               bad      sadness
## 36811               bad        anger
## 36812               bad      disgust
## 36813               bad         fear
## 36814               bad     negative
## 36815               bad      sadness
## 36816   inconsequential     negative
## 36817   inconsequential      sadness
## 36818             worse         fear
## 36819             worse     negative
## 36820             worse      sadness
## 36821             enjoy anticipation
## 36822             enjoy          joy
## 36823             enjoy     positive
## 36824             enjoy        trust
## 36825        contribute     positive
## 36826       radioactive         fear
## 36827       radioactive     negative
## 36828            happen anticipation
## 36829       radioactive         fear
## 36830       radioactive     negative
## 36831            ground        trust
## 36832            system        trust
## 36833       radioactive         fear
## 36834       radioactive     negative
## 36835             worse         fear
## 36836             worse     negative
## 36837             worse      sadness
## 36838         necessity      sadness
## 36839      contaminated      disgust
## 36840      contaminated         fear
## 36841      contaminated     negative
## 36842      contaminated      sadness
## 36843       radioactive         fear
## 36844       radioactive     negative
## 36845       radioactive         fear
## 36846       radioactive     negative
## 36847           dispose      disgust
## 36848            sudden     surprise
## 36849       radioactive         fear
## 36850       radioactive     negative
## 36851          drinking     negative
## 36852              safe          joy
## 36853              safe     positive
## 36854              safe        trust
## 36855         concerned         fear
## 36856         concerned      sadness
## 36857         operation         fear
## 36858         operation        trust
## 36859             board anticipation
## 36860            dilute     negative
## 36861            toilet      disgust
## 36862            toilet     negative
## 36863           chicken         fear
## 36864             waste      disgust
## 36865             waste     negative
## 36866               bad        anger
## 36867               bad      disgust
## 36868               bad         fear
## 36869               bad     negative
## 36870               bad      sadness
## 36871             waste      disgust
## 36872             waste     negative
## 36873              dumb     negative
## 36874          drinking     negative
## 36875             idiot      disgust
## 36876             idiot     negative
## 36877           finally anticipation
## 36878           finally      disgust
## 36879           finally          joy
## 36880           finally     positive
## 36881           finally     surprise
## 36882           finally        trust
## 36883            tackle        anger
## 36884            tackle     surprise
## 36885            crisis     negative
## 36886             happy anticipation
## 36887             happy          joy
## 36888             happy     positive
## 36889             happy        trust
## 36890              love          joy
## 36891              love     positive
## 36892              plan anticipation
## 36893             waste      disgust
## 36894             waste     negative
## 36895               pay anticipation
## 36896               pay          joy
## 36897               pay     positive
## 36898               pay        trust
## 36899             store anticipation
## 36900             store     positive
## 36901             store anticipation
## 36902             store     positive
## 36903             waste      disgust
## 36904             waste     negative
## 36905             awful        anger
## 36906             awful      disgust
## 36907             awful         fear
## 36908             awful     negative
## 36909             awful      sadness
## 36910              shit        anger
## 36911              shit      disgust
## 36912              shit     negative
## 36913           falling     negative
## 36914           falling      sadness
## 36915         avalanche         fear
## 36916         avalanche     negative
## 36917         avalanche      sadness
## 36918         avalanche     surprise
## 36919              love          joy
## 36920              love     positive
## 36921              plan anticipation
## 36922             waste      disgust
## 36923             waste     negative
## 36924              plan anticipation
## 36925             watch anticipation
## 36926             watch         fear
## 36927             waste      disgust
## 36928             waste     negative
## 36929          accident         fear
## 36930          accident     negative
## 36931          accident      sadness
## 36932          accident     surprise
## 36933         discharge     negative
## 36934          drinking     negative
## 36935            assure        trust
## 36936          official        trust
## 36937        earthquake        anger
## 36938        earthquake         fear
## 36939        earthquake     negative
## 36940        earthquake      sadness
## 36941        earthquake     surprise
## 36942             share anticipation
## 36943             share          joy
## 36944             share     positive
## 36945             share        trust
## 36946          accurate     positive
## 36947          accurate        trust
## 36948           precise     positive
## 36949             catch     surprise
## 36950      contaminated      disgust
## 36951      contaminated         fear
## 36952      contaminated     negative
## 36953      contaminated      sadness
## 36954            united     positive
## 36955            united        trust
## 36956         procedure         fear
## 36957         procedure     positive
## 36958              lost     negative
## 36959              lost      sadness
## 36960        confidence         fear
## 36961        confidence          joy
## 36962        confidence     positive
## 36963        confidence        trust
## 36964            public anticipation
## 36965            public     positive
## 36966        government         fear
## 36967        government     negative
## 36968         carefully     positive
## 36969            system        trust
## 36970           measure        trust
## 36971            status     positive
## 36972             worth     positive
## 36973             worry anticipation
## 36974             worry         fear
## 36975             worry     negative
## 36976             worry      sadness
## 36977       radioactive         fear
## 36978       radioactive     negative
## 36979               sun anticipation
## 36980               sun          joy
## 36981               sun     positive
## 36982               sun     surprise
## 36983               sun        trust
## 36984              plan anticipation
## 36985         radiation         fear
## 36986         radiation     negative
## 36987            result anticipation
## 36988         radiation         fear
## 36989         radiation     negative
## 36990           exposed     negative
## 36991            marine        trust
## 36992           harmful        anger
## 36993           harmful      disgust
## 36994           harmful         fear
## 36995           harmful     negative
## 36996           harmful      sadness
## 36997         radiation         fear
## 36998         radiation     negative
## 36999               bad        anger
## 37000               bad      disgust
## 37001               bad         fear
## 37002               bad     negative
## 37003               bad      sadness
## 37004       radioactive         fear
## 37005       radioactive     negative
## 37006              shit        anger
## 37007              shit      disgust
## 37008              shit     negative
## 37009           falling     negative
## 37010           falling      sadness
## 37011         avalanche         fear
## 37012         avalanche     negative
## 37013         avalanche      sadness
## 37014         avalanche     surprise
## 37015             focus     positive
## 37016            ignore     negative
## 37017          offender        anger
## 37018          offender      disgust
## 37019          offender         fear
## 37020          offender     negative
## 37021          offender      sadness
## 37022            stupid     negative
## 37023          derelict     negative
## 37024              land     positive
## 37025        government         fear
## 37026        government     negative
## 37027               tax     negative
## 37028               tax      sadness
## 37029               tax     negative
## 37030               tax      sadness
## 37031               pay anticipation
## 37032               pay          joy
## 37033               pay     positive
## 37034               pay        trust
## 37035           subsidy        anger
## 37036           subsidy      disgust
## 37037           subsidy     negative
## 37038           grammar        trust
## 37039               pay anticipation
## 37040               pay          joy
## 37041               pay     positive
## 37042               pay        trust
## 37043            incase        anger
## 37044            incase      disgust
## 37045            incase         fear
## 37046            incase     negative
## 37047            incase      sadness
## 37048             clean          joy
## 37049             clean     positive
## 37050             clean        trust
## 37051              mess      disgust
## 37052              mess     negative
## 37053         abandoned        anger
## 37054         abandoned         fear
## 37055         abandoned     negative
## 37056         abandoned      sadness
## 37057         abandoned        anger
## 37058         abandoned         fear
## 37059         abandoned     negative
## 37060         abandoned      sadness
## 37061          familiar     positive
## 37062          familiar        trust
## 37063         abandoned        anger
## 37064         abandoned         fear
## 37065         abandoned     negative
## 37066         abandoned      sadness
## 37067          recovery     positive
## 37068            assets     positive
## 37069             money        anger
## 37070             money anticipation
## 37071             money          joy
## 37072             money     positive
## 37073             money     surprise
## 37074             money        trust
## 37075         abandoned        anger
## 37076         abandoned         fear
## 37077         abandoned     negative
## 37078         abandoned      sadness
## 37079             clean          joy
## 37080             clean     positive
## 37081             clean        trust
## 37082             shove        anger
## 37083             shove     negative
## 37084              tree        anger
## 37085              tree anticipation
## 37086              tree      disgust
## 37087              tree          joy
## 37088              tree     positive
## 37089              tree     surprise
## 37090              tree        trust
## 37091            cement anticipation
## 37092            cement        trust
## 37093               top anticipation
## 37094               top     positive
## 37095               top        trust
## 37096            cement anticipation
## 37097            cement        trust
## 37098            broken        anger
## 37099            broken         fear
## 37100            broken     negative
## 37101            broken      sadness
## 37102           abandon         fear
## 37103           abandon     negative
## 37104           abandon      sadness
## 37105          horribly     negative
## 37106            budget        trust
## 37107            motion anticipation
## 37108            school        trust
## 37109             money        anger
## 37110             money anticipation
## 37111             money          joy
## 37112             money     positive
## 37113             money     surprise
## 37114             money        trust
## 37115              lost     negative
## 37116              lost      sadness
## 37117              debt     negative
## 37118              debt      sadness
## 37119              vote        anger
## 37120              vote anticipation
## 37121              vote          joy
## 37122              vote     negative
## 37123              vote     positive
## 37124              vote      sadness
## 37125              vote     surprise
## 37126              vote        trust
## 37127            afraid         fear
## 37128            afraid     negative
## 37129            excuse     negative
## 37130               tax     negative
## 37131               tax      sadness
## 37132             money        anger
## 37133             money anticipation
## 37134             money          joy
## 37135             money     positive
## 37136             money     surprise
## 37137             money        trust
## 37138           subsidy        anger
## 37139           subsidy      disgust
## 37140           subsidy     negative
## 37141          disagree        anger
## 37142          disagree     negative
## 37143           antique     positive
## 37144            escape anticipation
## 37145            escape         fear
## 37146            escape     negative
## 37147            escape     positive
## 37148         framework        trust
## 37149           prevent         fear
## 37150        production anticipation
## 37151        production     positive
## 37152               law        trust
## 37153             major     positive
## 37154             seize         fear
## 37155             seize     negative
## 37156             major     positive
## 37157             dirty      disgust
## 37158             dirty     negative
## 37159          included     positive
## 37160           leakage     negative
## 37161               fee        anger
## 37162               fee     negative
## 37163             green          joy
## 37164             green     positive
## 37165             green        trust
## 37166           killing        anger
## 37167           killing         fear
## 37168           killing     negative
## 37169           killing      sadness
## 37170               job     positive
## 37171               pay anticipation
## 37172               pay          joy
## 37173               pay     positive
## 37174               pay        trust
## 37175              clap anticipation
## 37176              clap          joy
## 37177              clap     positive
## 37178              clap        trust
## 37179               pay anticipation
## 37180               pay          joy
## 37181               pay     positive
## 37182               pay        trust
## 37183           defunct     negative
## 37184           defunct      sadness
## 37185          cleaning     positive
## 37186               law        trust
## 37187               tax     negative
## 37188               tax      sadness
## 37189          avoiding         fear
## 37190               tax     negative
## 37191               tax      sadness
## 37192           sincere     positive
## 37193           sincere        trust
## 37194           sarcasm        anger
## 37195           sarcasm      disgust
## 37196           sarcasm     negative
## 37197           sarcasm      sadness
## 37198             agree     positive
## 37199               tax     negative
## 37200               tax      sadness
## 37201       immediately anticipation
## 37202       immediately     negative
## 37203       immediately     positive
## 37204           footing        trust
## 37205          cleaning     positive
## 37206            public anticipation
## 37207            public     positive
## 37208            change         fear
## 37209         displaced        anger
## 37210         displaced         fear
## 37211         displaced      sadness
## 37212        contribute     positive
## 37213             clean          joy
## 37214             clean     positive
## 37215             clean        trust
## 37216             model     positive
## 37217               law        trust
## 37218             agree     positive
## 37219         difficult         fear
## 37220          solution     positive
## 37221        difficulty        anger
## 37222        difficulty         fear
## 37223        difficulty     negative
## 37224        difficulty      sadness
## 37225            system        trust
## 37226               fee        anger
## 37227               fee     negative
## 37228            cherry     positive
## 37229          powerful        anger
## 37230          powerful anticipation
## 37231          powerful      disgust
## 37232          powerful         fear
## 37233          powerful          joy
## 37234          powerful     positive
## 37235          powerful        trust
## 37236        production anticipation
## 37237        production     positive
## 37238               fee        anger
## 37239               fee     negative
## 37240               pay anticipation
## 37241               pay          joy
## 37242               pay     positive
## 37243               pay        trust
## 37244            orphan         fear
## 37245            orphan     negative
## 37246            orphan      sadness
## 37247         challenge        anger
## 37248         challenge         fear
## 37249         challenge     negative
## 37250               pay anticipation
## 37251               pay          joy
## 37252               pay     positive
## 37253               pay        trust
## 37254             cover        trust
## 37255              glad anticipation
## 37256              glad          joy
## 37257              glad     positive
## 37258              bang        anger
## 37259              bang      disgust
## 37260              bang         fear
## 37261              bang     negative
## 37262              bang      sadness
## 37263              bang     surprise
## 37264              buck         fear
## 37265              buck     negative
## 37266              buck     positive
## 37267              buck     surprise
## 37268             money        anger
## 37269             money anticipation
## 37270             money          joy
## 37271             money     positive
## 37272             money     surprise
## 37273             money        trust
## 37274             money        anger
## 37275             money anticipation
## 37276             money          joy
## 37277             money     positive
## 37278             money     surprise
## 37279             money        trust
## 37280             spent     negative
## 37281            recoup     positive
## 37282             hurry anticipation
## 37283             agree     positive
## 37284         statement     positive
## 37285         statement        trust
## 37286             farce     negative
## 37287               tax     negative
## 37288               tax      sadness
## 37289               pay anticipation
## 37290               pay          joy
## 37291               pay     positive
## 37292               pay        trust
## 37293           abandon         fear
## 37294           abandon     negative
## 37295           abandon      sadness
## 37296             clean          joy
## 37297             clean     positive
## 37298             clean        trust
## 37299         socialism      disgust
## 37300         socialism         fear
## 37301            happen anticipation
## 37302       immediately anticipation
## 37303       immediately     negative
## 37304       immediately     positive
## 37305              hope anticipation
## 37306              hope          joy
## 37307              hope     positive
## 37308              hope     surprise
## 37309              hope        trust
## 37310               tax     negative
## 37311               tax      sadness
## 37312            recoup     positive
## 37313              hope anticipation
## 37314              hope          joy
## 37315              hope     positive
## 37316              hope     surprise
## 37317              hope        trust
## 37318               tax     negative
## 37319               tax      sadness
## 37320               tax     negative
## 37321               tax      sadness
## 37322               tax     negative
## 37323               tax      sadness
## 37324         pollution      disgust
## 37325         pollution     negative
## 37326            change         fear
## 37327           account        trust
## 37328               cap anticipation
## 37329               cap        trust
## 37330               pay anticipation
## 37331               pay          joy
## 37332               pay     positive
## 37333               pay        trust
## 37334           ungodly     negative
## 37335           ungodly      sadness
## 37336             money        anger
## 37337             money anticipation
## 37338             money          joy
## 37339             money     positive
## 37340             money     surprise
## 37341             money        trust
## 37342           abandon         fear
## 37343           abandon     negative
## 37344           abandon      sadness
## 37345             leave     negative
## 37346             leave      sadness
## 37347             leave     surprise
## 37348            hazard         fear
## 37349            hazard     negative
## 37350              rest     positive
## 37351             major     positive
## 37352             money        anger
## 37353             money anticipation
## 37354             money          joy
## 37355             money     positive
## 37356             money     surprise
## 37357             money        trust
## 37358               pay anticipation
## 37359               pay          joy
## 37360               pay     positive
## 37361               pay        trust
## 37362               pay anticipation
## 37363               pay          joy
## 37364               pay     positive
## 37365               pay        trust
## 37366          bankrupt         fear
## 37367          bankrupt     negative
## 37368          bankrupt      sadness
## 37369             leave     negative
## 37370             leave      sadness
## 37371             leave     surprise
## 37372              shit        anger
## 37373              shit      disgust
## 37374              shit     negative
## 37375               tax     negative
## 37376               tax      sadness
## 37377             clean          joy
## 37378             clean     positive
## 37379             clean        trust
## 37380            suffer     negative
## 37381         legalized        anger
## 37382         legalized         fear
## 37383         legalized          joy
## 37384         legalized     positive
## 37385         legalized        trust
## 37386             theft        anger
## 37387             theft      disgust
## 37388             theft         fear
## 37389             theft     negative
## 37390             theft      sadness
## 37391            public anticipation
## 37392            public     positive
## 37393          bankrupt         fear
## 37394          bankrupt     negative
## 37395          bankrupt      sadness
## 37396             board anticipation
## 37397              lost     negative
## 37398              lost      sadness
## 37399               ass     negative
## 37400              spew      disgust
## 37401            scheme     negative
## 37402             agree     positive
## 37403        government         fear
## 37404        government     negative
## 37405             clean          joy
## 37406             clean     positive
## 37407             clean        trust
## 37408              deal anticipation
## 37409              deal          joy
## 37410              deal     positive
## 37411              deal     surprise
## 37412              deal        trust
## 37413             count     positive
## 37414             count        trust
## 37415           subsidy        anger
## 37416           subsidy      disgust
## 37417           subsidy     negative
## 37418              glad anticipation
## 37419              glad          joy
## 37420              glad     positive
## 37421              deal anticipation
## 37422              deal          joy
## 37423              deal     positive
## 37424              deal     surprise
## 37425              deal        trust
## 37426             leave     negative
## 37427             leave      sadness
## 37428             leave     surprise
## 37429              deal anticipation
## 37430              deal          joy
## 37431              deal     positive
## 37432              deal     surprise
## 37433              deal        trust
## 37434       eventuality anticipation
## 37435       eventuality         fear
## 37436        completely     positive
## 37437            rocket        anger
## 37438         socialism      disgust
## 37439         socialism         fear
## 37440            income anticipation
## 37441            income          joy
## 37442            income     negative
## 37443            income     positive
## 37444            income      sadness
## 37445            income        trust
## 37446         abandoned        anger
## 37447         abandoned         fear
## 37448         abandoned     negative
## 37449         abandoned      sadness
## 37450         producing     positive
## 37451             sense     positive
## 37452         resources          joy
## 37453         resources     positive
## 37454         resources        trust
## 37455        productive     positive
## 37456         abandoned        anger
## 37457         abandoned         fear
## 37458         abandoned     negative
## 37459         abandoned      sadness
## 37460          cleaning     positive
## 37461              mess      disgust
## 37462              mess     negative
## 37463        completely     positive
## 37464            orphan         fear
## 37465            orphan     negative
## 37466            orphan      sadness
## 37467            orphan         fear
## 37468            orphan     negative
## 37469            orphan      sadness
## 37470            orphan         fear
## 37471            orphan     negative
## 37472            orphan      sadness
## 37473            orphan         fear
## 37474            orphan     negative
## 37475            orphan      sadness
## 37476         abandoned        anger
## 37477         abandoned         fear
## 37478         abandoned     negative
## 37479         abandoned      sadness
## 37480         abandoned        anger
## 37481         abandoned         fear
## 37482         abandoned     negative
## 37483         abandoned      sadness
## 37484         producing     positive
## 37485               pay anticipation
## 37486               pay          joy
## 37487               pay     positive
## 37488               pay        trust
## 37489               cap anticipation
## 37490               cap        trust
## 37491        production anticipation
## 37492        production     positive
## 37493         producing     positive
## 37494         producing     positive
## 37495            demand        anger
## 37496            demand     negative
## 37497        production anticipation
## 37498        production     positive
## 37499         abandoned        anger
## 37500         abandoned         fear
## 37501         abandoned     negative
## 37502         abandoned      sadness
## 37503         producing     positive
## 37504         strategic     positive
## 37505           reserve     positive
## 37506       information     positive
## 37507              fool      disgust
## 37508              fool     negative
## 37509        government         fear
## 37510        government     negative
## 37511       responsible     positive
## 37512       responsible        trust
## 37513            public anticipation
## 37514            public     positive
## 37515             clean          joy
## 37516             clean     positive
## 37517             clean        trust
## 37518               cap anticipation
## 37519               cap        trust
## 37520          bankrupt         fear
## 37521          bankrupt     negative
## 37522          bankrupt      sadness
## 37523               cap anticipation
## 37524               cap        trust
## 37525       responsible     positive
## 37526       responsible        trust
## 37527          bankrupt         fear
## 37528          bankrupt     negative
## 37529          bankrupt      sadness
## 37530             force        anger
## 37531             force         fear
## 37532             force     negative
## 37533              real     positive
## 37534              real        trust
## 37535         socialism      disgust
## 37536         socialism         fear
## 37537               pay anticipation
## 37538               pay          joy
## 37539               pay     positive
## 37540               pay        trust
## 37541           deficit     negative
## 37542             learn     positive
## 37543        production anticipation
## 37544        production     positive
## 37545             laden     negative
## 37546             coast     positive
## 37547               pay anticipation
## 37548               pay          joy
## 37549               pay     positive
## 37550               pay        trust
## 37551        government         fear
## 37552        government     negative
## 37553              land     positive
## 37554             avoid         fear
## 37555             avoid     negative
## 37556               pay anticipation
## 37557               pay          joy
## 37558               pay     positive
## 37559               pay        trust
## 37560              debt     negative
## 37561              debt      sadness
## 37562               top anticipation
## 37563               top     positive
## 37564               top        trust
## 37565          producer     positive
## 37566        shockingly     surprise
## 37567            prefer     positive
## 37568            prefer        trust
## 37569            reward anticipation
## 37570            reward          joy
## 37571            reward     positive
## 37572            reward     surprise
## 37573            reward        trust
## 37574           obscene      disgust
## 37575           obscene     negative
## 37576        government         fear
## 37577        government     negative
## 37578              real     positive
## 37579              real        trust
## 37580          question     positive
## 37581               top anticipation
## 37582               top     positive
## 37583               top        trust
## 37584         surprised     surprise
## 37585            chance     surprise
## 37586             lying        anger
## 37587             lying      disgust
## 37588             lying     negative
## 37589              dupe        anger
## 37590              dupe     negative
## 37591            change         fear
## 37592            denial     negative
## 37593              main     positive
## 37594           suspect         fear
## 37595           suspect     negative
## 37596            change         fear
## 37597            denial     negative
## 37598            denial     negative
## 37599             board anticipation
## 37600            change         fear
## 37601          hospital         fear
## 37602          hospital      sadness
## 37603          hospital        trust
## 37604              sick      disgust
## 37605              sick     negative
## 37606              sick      sadness
## 37607           injured         fear
## 37608           injured     negative
## 37609           injured      sadness
## 37610               god anticipation
## 37611               god         fear
## 37612               god          joy
## 37613               god     positive
## 37614               god        trust
## 37615             death        anger
## 37616             death anticipation
## 37617             death      disgust
## 37618             death         fear
## 37619             death     negative
## 37620             death      sadness
## 37621             death     surprise
## 37622            career anticipation
## 37623            career     positive
## 37624              fire         fear
## 37625            arrest     negative
## 37626            pretty anticipation
## 37627            pretty          joy
## 37628            pretty     positive
## 37629            pretty        trust
## 37630             lines         fear
## 37631            praise          joy
## 37632            praise     positive
## 37633            praise        trust
## 37634               god anticipation
## 37635               god         fear
## 37636               god          joy
## 37637               god     positive
## 37638               god        trust
## 37639           miracle anticipation
## 37640           miracle          joy
## 37641           miracle     positive
## 37642           miracle     surprise
## 37643           miracle        trust
## 37644             bitch        anger
## 37645             bitch      disgust
## 37646             bitch         fear
## 37647             bitch     negative
## 37648             bitch      sadness
## 37649         effective     positive
## 37650         effective        trust
## 37651         ambulance         fear
## 37652         ambulance        trust
## 37653              team        trust
## 37654         emergency         fear
## 37655         emergency     negative
## 37656         emergency      sadness
## 37657         emergency     surprise
## 37658           miracle anticipation
## 37659           miracle          joy
## 37660           miracle     positive
## 37661           miracle     surprise
## 37662           miracle        trust
## 37663               god anticipation
## 37664               god         fear
## 37665               god          joy
## 37666               god     positive
## 37667               god        trust
## 37668              amen          joy
## 37669              amen     positive
## 37670              amen        trust
## 37671              crap      disgust
## 37672              crap     negative
## 37673               god anticipation
## 37674               god         fear
## 37675               god          joy
## 37676               god     positive
## 37677               god        trust
## 37678             found          joy
## 37679             found     positive
## 37680             found        trust
## 37681             agree     positive
## 37682               god anticipation
## 37683               god         fear
## 37684               god          joy
## 37685               god     positive
## 37686               god        trust
## 37687        mysterious anticipation
## 37688        mysterious         fear
## 37689        mysterious     surprise
## 37690              plan anticipation
## 37691              plan anticipation
## 37692              plan anticipation
## 37693               god anticipation
## 37694               god         fear
## 37695               god          joy
## 37696               god     positive
## 37697               god        trust
## 37698            bother     negative
## 37699              time anticipation
## 37700               god anticipation
## 37701               god         fear
## 37702               god          joy
## 37703               god     positive
## 37704               god        trust
## 37705            chance     surprise
## 37706               god anticipation
## 37707               god         fear
## 37708               god          joy
## 37709               god     positive
## 37710               god        trust
## 37711              pray anticipation
## 37712              pray         fear
## 37713              pray          joy
## 37714              pray     positive
## 37715              pray     surprise
## 37716              pray        trust
## 37717           outcome     positive
## 37718           sinning      disgust
## 37719           sinning     negative
## 37720               sin        anger
## 37721               sin      disgust
## 37722               sin         fear
## 37723               sin     negative
## 37724               sin      sadness
## 37725              quit     negative
## 37726               god anticipation
## 37727               god         fear
## 37728               god          joy
## 37729               god     positive
## 37730               god        trust
## 37731               god anticipation
## 37732               god         fear
## 37733               god          joy
## 37734               god     positive
## 37735               god        trust
## 37736          standing     positive
## 37737            happen anticipation
## 37738            cancer        anger
## 37739            cancer      disgust
## 37740            cancer         fear
## 37741            cancer     negative
## 37742            cancer      sadness
## 37743          hospital         fear
## 37744          hospital      sadness
## 37745          hospital        trust
## 37746               god anticipation
## 37747               god         fear
## 37748               god          joy
## 37749               god     positive
## 37750               god        trust
## 37751           miracle anticipation
## 37752           miracle          joy
## 37753           miracle     positive
## 37754           miracle     surprise
## 37755           miracle        trust
## 37756           prepare anticipation
## 37757           prepare     positive
## 37758             happy anticipation
## 37759             happy          joy
## 37760             happy     positive
## 37761             happy        trust
## 37762              lord      disgust
## 37763              lord     negative
## 37764              lord     positive
## 37765              lord        trust
## 37766           medical anticipation
## 37767           medical         fear
## 37768           medical     positive
## 37769           medical        trust
## 37770             death        anger
## 37771             death anticipation
## 37772             death      disgust
## 37773             death         fear
## 37774             death     negative
## 37775             death      sadness
## 37776             death     surprise
## 37777          intended anticipation
## 37778          intended     positive
## 37779               god anticipation
## 37780               god         fear
## 37781               god          joy
## 37782               god     positive
## 37783               god        trust
## 37784      intervention     negative
## 37785      intervention     positive
## 37786      intervention      sadness
## 37787         candidate     positive
## 37788               god anticipation
## 37789               god         fear
## 37790               god          joy
## 37791               god     positive
## 37792               god        trust
## 37793             proof        trust
## 37794           patient anticipation
## 37795           patient     positive
## 37796               god anticipation
## 37797               god         fear
## 37798               god          joy
## 37799               god     positive
## 37800               god        trust
## 37801            attack        anger
## 37802            attack         fear
## 37803            attack     negative
## 37804          hospital         fear
## 37805          hospital      sadness
## 37806          hospital        trust
## 37807              fake     negative
## 37808             treat        anger
## 37809             treat anticipation
## 37810             treat      disgust
## 37811             treat         fear
## 37812             treat          joy
## 37813             treat     negative
## 37814             treat     positive
## 37815             treat      sadness
## 37816             treat     surprise
## 37817             treat        trust
## 37818           benefit     positive
## 37819          renounce        anger
## 37820          renounce     negative
## 37821          religion        trust
## 37822          hospital         fear
## 37823          hospital      sadness
## 37824          hospital        trust
## 37825             dying        anger
## 37826             dying      disgust
## 37827             dying         fear
## 37828             dying     negative
## 37829             dying      sadness
## 37830            cancer        anger
## 37831            cancer      disgust
## 37832            cancer         fear
## 37833            cancer     negative
## 37834            cancer      sadness
## 37835        regressive     negative
## 37836        regressive     positive
## 37837              time anticipation
## 37838           liberal     negative
## 37839           liberal     positive
## 37840            change         fear
## 37841        regressive     negative
## 37842        regressive     positive
## 37843       established          joy
## 37844       established     positive
## 37845        regressive     negative
## 37846        regressive     positive
## 37847           supreme     positive
## 37848             court        anger
## 37849             court anticipation
## 37850             court         fear
## 37851       devastating        anger
## 37852       devastating      disgust
## 37853       devastating         fear
## 37854       devastating     negative
## 37855       devastating      sadness
## 37856       devastating        trust
## 37857              land     positive
## 37858         supported     positive
## 37859               ban     negative
## 37860              lead     positive
## 37861           harmful        anger
## 37862           harmful      disgust
## 37863           harmful         fear
## 37864           harmful     negative
## 37865           harmful      sadness
## 37866            change         fear
## 37867            denial     negative
## 37868         promotion     positive
## 37869         petroleum      disgust
## 37870         petroleum     negative
## 37871         petroleum     positive
## 37872             truth     positive
## 37873             truth        trust
## 37874            policy        trust
## 37875         supported     positive
## 37876            oppose     negative
## 37877            afraid         fear
## 37878            afraid     negative
## 37879             extra     positive
## 37880              deny        anger
## 37881              deny     negative
## 37882            change         fear
## 37883            denial     negative
## 37884            denial     negative
## 37885             money        anger
## 37886             money anticipation
## 37887             money          joy
## 37888             money     positive
## 37889             money     surprise
## 37890             money        trust
## 37891           ability     positive
## 37892             money        anger
## 37893             money anticipation
## 37894             money          joy
## 37895             money     positive
## 37896             money     surprise
## 37897             money        trust
## 37898          critique     positive
## 37899             found          joy
## 37900             found     positive
## 37901             found        trust
## 37902              love          joy
## 37903              love     positive
## 37904              word     positive
## 37905              word        trust
## 37906      intellectual     positive
## 37907         excellent          joy
## 37908         excellent     positive
## 37909         excellent        trust
## 37910             burke        anger
## 37911             burke      disgust
## 37912             burke         fear
## 37913             burke     negative
## 37914             burke      sadness
## 37915              cash        anger
## 37916              cash anticipation
## 37917              cash         fear
## 37918              cash          joy
## 37919              cash     positive
## 37920              cash        trust
## 37921            reason     positive
## 37922         household     positive
## 37923         expertise     positive
## 37924         expertise        trust
## 37925          guidance     positive
## 37926          guidance        trust
## 37927        government         fear
## 37928        government     negative
## 37929           related        trust
## 37930           corrupt     negative
## 37931             start anticipation
## 37932            nation        trust
## 37933         skeptical     negative
## 37934       consistency     positive
## 37935       consistency        trust
## 37936            denial     negative
## 37937               bad        anger
## 37938               bad      disgust
## 37939               bad         fear
## 37940               bad     negative
## 37941               bad      sadness
## 37942           refusal     negative
## 37943        quarantine         fear
## 37944              dark      sadness
## 37945          religion        trust
## 37946          progress anticipation
## 37947          progress          joy
## 37948          progress     positive
## 37949              dark      sadness
## 37950        veneration     positive
## 37951            relics      sadness
## 37952        priesthood anticipation
## 37953        priesthood          joy
## 37954        priesthood     positive
## 37955        priesthood      sadness
## 37956        priesthood        trust
## 37957             moral        anger
## 37958             moral     positive
## 37959             moral        trust
## 37960         hypocrisy     negative
## 37961               art anticipation
## 37962               art          joy
## 37963               art     positive
## 37964               art      sadness
## 37965               art     surprise
## 37966              fell     negative
## 37967              fell      sadness
## 37968             cliff         fear
## 37969               art anticipation
## 37970               art          joy
## 37971               art     positive
## 37972               art      sadness
## 37973               art     surprise
## 37974         practiced          joy
## 37975         practiced     positive
## 37976         practiced     surprise
## 37977         practiced        trust
## 37978            taught        trust
## 37979     controversial        anger
## 37980     controversial     negative
## 37981       blasphemous        anger
## 37982       blasphemous      disgust
## 37983       blasphemous     negative
## 37984         incorrect     negative
## 37985            church anticipation
## 37986            church          joy
## 37987            church     positive
## 37988            church        trust
## 37989               don     positive
## 37990               don        trust
## 37991              dark      sadness
## 37992             agree     positive
## 37993          yearning anticipation
## 37994          yearning          joy
## 37995          yearning     negative
## 37996          yearning     positive
## 37997          yearning        trust
## 37998               god anticipation
## 37999               god         fear
## 38000               god          joy
## 38001               god     positive
## 38002               god        trust
## 38003            suffer     negative
## 38004         perennial     positive
## 38005         perennial        trust
## 38006          question     positive
## 38007               god anticipation
## 38008               god         fear
## 38009               god          joy
## 38010               god     positive
## 38011               god        trust
## 38012               god anticipation
## 38013               god         fear
## 38014               god          joy
## 38015               god     positive
## 38016               god        trust
## 38017            nation        trust
## 38018            result anticipation
## 38019           citizen     positive
## 38020        completely     positive
## 38021             agree     positive
## 38022             faith anticipation
## 38023             faith          joy
## 38024             faith     positive
## 38025             faith        trust
## 38026          politics        anger
## 38027             faith anticipation
## 38028             faith          joy
## 38029             faith     positive
## 38030             faith        trust
## 38031            inform        trust
## 38032          politics        anger
## 38033          politics        anger
## 38034          abortion      disgust
## 38035          abortion         fear
## 38036          abortion     negative
## 38037          abortion      sadness
## 38038            change         fear
## 38039              time anticipation
## 38040          strongly     positive
## 38041             sense     positive
## 38042              talk     positive
## 38043           condemn        anger
## 38044           condemn     negative
## 38045          abortion      disgust
## 38046          abortion         fear
## 38047          abortion     negative
## 38048          abortion      sadness
## 38049           suggest        trust
## 38050          humanity          joy
## 38051          humanity     positive
## 38052          humanity        trust
## 38053           slavery        anger
## 38054           slavery      disgust
## 38055           slavery         fear
## 38056           slavery     negative
## 38057           slavery      sadness
## 38058         untenable     negative
## 38059          suddenly     surprise
## 38060              cool     positive
## 38061             faith anticipation
## 38062             faith          joy
## 38063             faith     positive
## 38064             faith        trust
## 38065          polygamy      disgust
## 38066          polygamy     negative
## 38067           divorce        anger
## 38068           divorce      disgust
## 38069           divorce         fear
## 38070           divorce     negative
## 38071           divorce      sadness
## 38072           divorce     surprise
## 38073           divorce        trust
## 38074          biblical     positive
## 38075              claw        anger
## 38076              claw         fear
## 38077              claw     negative
## 38078        antiquated     negative
## 38079         disparity        anger
## 38080         disparity      disgust
## 38081         disparity     negative
## 38082         disparity      sadness
## 38083            pretty anticipation
## 38084            pretty          joy
## 38085            pretty     positive
## 38086            pretty        trust
## 38087            church anticipation
## 38088            church          joy
## 38089            church     positive
## 38090            church        trust
## 38091           condemn        anger
## 38092           condemn     negative
## 38093           suspect         fear
## 38094           suspect     negative
## 38095            change         fear
## 38096            pastor          joy
## 38097            pastor     positive
## 38098            pastor        trust
## 38099               god anticipation
## 38100               god         fear
## 38101               god          joy
## 38102               god     positive
## 38103               god        trust
## 38104          educated     positive
## 38105            pastor          joy
## 38106            pastor     positive
## 38107            pastor        trust
## 38108              true          joy
## 38109              true     positive
## 38110              true        trust
## 38111            pastor          joy
## 38112            pastor     positive
## 38113            pastor        trust
## 38114            church anticipation
## 38115            church          joy
## 38116            church     positive
## 38117            church        trust
## 38118            pastor          joy
## 38119            pastor     positive
## 38120            pastor        trust
## 38121            church anticipation
## 38122            church          joy
## 38123            church     positive
## 38124            church        trust
## 38125         confirmed     positive
## 38126         confirmed        trust
## 38127      confirmation        trust
## 38128              bias        anger
## 38129              bias     negative
## 38130         hilarious          joy
## 38131         hilarious     positive
## 38132         hilarious     surprise
## 38133            church anticipation
## 38134            church          joy
## 38135            church     positive
## 38136            church        trust
## 38137            church anticipation
## 38138            church          joy
## 38139            church     positive
## 38140            church        trust
## 38141            elders     positive
## 38142            elders        trust
## 38143           knowing     positive
## 38144            church anticipation
## 38145            church          joy
## 38146            church     positive
## 38147            church        trust
## 38148            change         fear
## 38149            reward anticipation
## 38150            reward          joy
## 38151            reward     positive
## 38152            reward     surprise
## 38153            reward        trust
## 38154              save          joy
## 38155              save     positive
## 38156              save        trust
## 38157          dominion         fear
## 38158          dominion        trust
## 38159             faith anticipation
## 38160             faith          joy
## 38161             faith     positive
## 38162             faith        trust
## 38163              gift anticipation
## 38164              gift          joy
## 38165              gift     positive
## 38166              gift     surprise
## 38167              ruin         fear
## 38168              ruin     negative
## 38169              ruin      sadness
## 38170            broken        anger
## 38171            broken         fear
## 38172            broken     negative
## 38173            broken      sadness
## 38174              gift anticipation
## 38175              gift          joy
## 38176              gift     positive
## 38177              gift     surprise
## 38178             watch anticipation
## 38179             watch         fear
## 38180           explain     positive
## 38181           explain        trust
## 38182              mess      disgust
## 38183              mess     negative
## 38184             blame        anger
## 38185             blame      disgust
## 38186             blame     negative
## 38187              bear        anger
## 38188              bear         fear
## 38189               god anticipation
## 38190               god         fear
## 38191               god          joy
## 38192               god     positive
## 38193               god        trust
## 38194          innocent     positive
## 38195          innocent        trust
## 38196               god anticipation
## 38197               god         fear
## 38198               god          joy
## 38199               god     positive
## 38200               god        trust
## 38201               mad        anger
## 38202               mad      disgust
## 38203               mad         fear
## 38204               mad     negative
## 38205               mad      sadness
## 38206            happen anticipation
## 38207            pretty anticipation
## 38208            pretty          joy
## 38209            pretty     positive
## 38210            pretty        trust
## 38211          religion        trust
## 38212              wise     positive
## 38213            change         fear
## 38214              real     positive
## 38215              real        trust
## 38216               god anticipation
## 38217               god         fear
## 38218               god          joy
## 38219               god     positive
## 38220               god        trust
## 38221             flood         fear
## 38222            change         fear
## 38223          religion        trust
## 38224              deny        anger
## 38225              deny     negative
## 38226        constantly        trust
## 38227            change         fear
## 38228            denial     negative
## 38229              fear        anger
## 38230              fear         fear
## 38231              fear     negative
## 38232           economy        trust
## 38233              fear        anger
## 38234              fear         fear
## 38235              fear     negative
## 38236         authority     positive
## 38237         authority        trust
## 38238        conformity        trust
## 38239           loyalty     positive
## 38240           loyalty        trust
## 38241         hostility        anger
## 38242         hostility      disgust
## 38243         hostility     negative
## 38244          religion        trust
## 38245          military         fear
## 38246              fear        anger
## 38247              fear         fear
## 38248              fear     negative
## 38249          powerful        anger
## 38250          powerful anticipation
## 38251          powerful      disgust
## 38252          powerful         fear
## 38253          powerful          joy
## 38254          powerful     positive
## 38255          powerful        trust
## 38256       susceptible     negative
## 38257      manipulation        anger
## 38258      manipulation         fear
## 38259      manipulation     negative
## 38260               bad        anger
## 38261               bad      disgust
## 38262               bad         fear
## 38263               bad     negative
## 38264               bad      sadness
## 38265             beast        anger
## 38266             beast         fear
## 38267             beast     negative
## 38268              fear        anger
## 38269              fear         fear
## 38270              fear     negative
## 38271             study     positive
## 38272       susceptible     negative
## 38273         believing     positive
## 38274         believing        trust
## 38275          politics        anger
## 38276         cognitive     positive
## 38277            change         fear
## 38278           culture     positive
## 38279        corruption      disgust
## 38280        corruption     negative
## 38281              deny        anger
## 38282              deny     negative
## 38283            change         fear
## 38284             waste      disgust
## 38285             waste     negative
## 38286         resources          joy
## 38287         resources     positive
## 38288         resources        trust
## 38289            denial     negative
## 38290        capitalist     positive
## 38291            denial     negative
## 38292            pretty anticipation
## 38293            pretty          joy
## 38294            pretty     positive
## 38295            pretty        trust
## 38296       established          joy
## 38297       established     positive
## 38298        contingent anticipation
## 38299           balance     positive
## 38300             argue        anger
## 38301             argue     negative
## 38302               god anticipation
## 38303               god         fear
## 38304               god          joy
## 38305               god     positive
## 38306               god        trust
## 38307            scheme     negative
## 38308          religion        trust
## 38309         misplaced     negative
## 38310           freedom          joy
## 38311           freedom     positive
## 38312           freedom        trust
## 38313             shoot        anger
## 38314             shoot         fear
## 38315             shoot     negative
## 38316           freedom          joy
## 38317           freedom     positive
## 38318           freedom        trust
## 38319           pollute      disgust
## 38320           pollute     negative
## 38321           freedom          joy
## 38322           freedom     positive
## 38323           freedom        trust
## 38324          increase     positive
## 38325           freedom          joy
## 38326           freedom     positive
## 38327           freedom        trust
## 38328            reject        anger
## 38329            reject         fear
## 38330            reject     negative
## 38331            reject      sadness
## 38332           vaccine     positive
## 38333           freedom          joy
## 38334           freedom     positive
## 38335           freedom        trust
## 38336          abortion      disgust
## 38337          abortion         fear
## 38338          abortion     negative
## 38339          abortion      sadness
## 38340      hypocritical      disgust
## 38341      hypocritical     negative
## 38342            pretty anticipation
## 38343            pretty          joy
## 38344            pretty     positive
## 38345            pretty        trust
## 38346            ignore     negative
## 38347              holy     positive
## 38348             trash      disgust
## 38349             trash     negative
## 38350             trash      sadness
## 38351              true          joy
## 38352              true     positive
## 38353              true        trust
## 38354              talk     positive
## 38355               sin        anger
## 38356               sin      disgust
## 38357               sin         fear
## 38358               sin     negative
## 38359               sin      sadness
## 38360            change         fear
## 38361         testament anticipation
## 38362         testament        trust
## 38363          familiar     positive
## 38364          familiar        trust
## 38365       intelligent     positive
## 38366       intelligent        trust
## 38367            harbor        trust
## 38368             faith anticipation
## 38369             faith          joy
## 38370             faith     positive
## 38371             faith        trust
## 38372            virtue     positive
## 38373            virtue        trust
## 38374            absent     negative
## 38375            absent      sadness
## 38376        supporting     positive
## 38377        supporting        trust
## 38378            change         fear
## 38379             money        anger
## 38380             money anticipation
## 38381             money          joy
## 38382             money     positive
## 38383             money     surprise
## 38384             money        trust
## 38385             enemy        anger
## 38386             enemy      disgust
## 38387             enemy         fear
## 38388             enemy     negative
## 38389             trump     surprise
## 38390               ass     negative
## 38391           economy        trust
## 38392             labor anticipation
## 38393             labor          joy
## 38394             labor     positive
## 38395             labor     surprise
## 38396             labor        trust
## 38397         untenable     negative
## 38398           opposed        anger
## 38399           opposed         fear
## 38400           opposed     negative
## 38401            credit     positive
## 38402            credit        trust
## 38403           economy        trust
## 38404           protect     positive
## 38405        disastrous        anger
## 38406        disastrous         fear
## 38407        disastrous     negative
## 38408        disastrous      sadness
## 38409            change         fear
## 38410           opposed        anger
## 38411           opposed         fear
## 38412           opposed     negative
## 38413              loss        anger
## 38414              loss         fear
## 38415              loss     negative
## 38416              loss      sadness
## 38417            larger      disgust
## 38418            larger     surprise
## 38419            larger        trust
## 38420             money        anger
## 38421             money anticipation
## 38422             money          joy
## 38423             money     positive
## 38424             money     surprise
## 38425             money        trust
## 38426            change         fear
## 38427           suspect         fear
## 38428           suspect     negative
## 38429            larger      disgust
## 38430            larger     surprise
## 38431            larger        trust
## 38432        irrational      disgust
## 38433        irrational         fear
## 38434        irrational     negative
## 38435              fear        anger
## 38436              fear         fear
## 38437              fear     negative
## 38438           unknown anticipation
## 38439           unknown         fear
## 38440           unknown     negative
## 38441              fear        anger
## 38442              fear         fear
## 38443              fear     negative
## 38444          measured     positive
## 38445          measured        trust
## 38446          ignorant      disgust
## 38447          ignorant     negative
## 38448          gullible     negative
## 38449          gullible      sadness
## 38450          gullible        trust
## 38451          cowardly         fear
## 38452          cowardly     negative
## 38453       susceptible     negative
## 38454         advantage     positive
## 38455             quack      disgust
## 38456             quack     negative
## 38457           medical anticipation
## 38458           medical         fear
## 38459           medical     positive
## 38460           medical        trust
## 38461             trump     surprise
## 38462        concentric     positive
## 38463         defending     positive
## 38464              true          joy
## 38465              true     positive
## 38466              true        trust
## 38467        opposition        anger
## 38468        opposition     negative
## 38469        government         fear
## 38470        government     negative
## 38471      interference     negative
## 38472         orthodoxy        trust
## 38473            threat        anger
## 38474            threat         fear
## 38475            threat     negative
## 38476            system        trust
## 38477            father        trust
## 38478               law        trust
## 38479            pastor          joy
## 38480            pastor     positive
## 38481            pastor        trust
## 38482               god anticipation
## 38483               god         fear
## 38484               god          joy
## 38485               god     positive
## 38486               god        trust
## 38487               don     positive
## 38488               don        trust
## 38489              real     positive
## 38490              real        trust
## 38491              cult         fear
## 38492              cult     negative
## 38493        surprising     surprise
## 38494            change         fear
## 38495            change         fear
## 38496              deny        anger
## 38497              deny     negative
## 38498          agreeing     positive
## 38499          agreeing        trust
## 38500         arguments        anger
## 38501            change         fear
## 38502            denial     negative
## 38503          abortion      disgust
## 38504          abortion         fear
## 38505          abortion     negative
## 38506          abortion      sadness
## 38507        prosperity     positive
## 38508              core     positive
## 38509               god anticipation
## 38510               god         fear
## 38511               god          joy
## 38512               god     positive
## 38513               god        trust
## 38514           modesty     positive
## 38515            wealth          joy
## 38516            wealth     positive
## 38517            wealth        trust
## 38518         community     positive
## 38519            change         fear
## 38520             scare        anger
## 38521             scare anticipation
## 38522             scare         fear
## 38523             scare     negative
## 38524             scare     surprise
## 38525        ultimately anticipation
## 38526        ultimately     positive
## 38527         community     positive
## 38528            change         fear
## 38529             sense     positive
## 38530      organization anticipation
## 38531      organization          joy
## 38532      organization     positive
## 38533      organization     surprise
## 38534      organization        trust
## 38535             teach          joy
## 38536             teach     positive
## 38537             teach     surprise
## 38538             teach        trust
## 38539            frugal     positive
## 38540         community     positive
## 38541              grow anticipation
## 38542              grow          joy
## 38543              grow     positive
## 38544              grow        trust
## 38545           charity          joy
## 38546           charity     positive
## 38547            pastor          joy
## 38548            pastor     positive
## 38549            pastor        trust
## 38550               pay anticipation
## 38551               pay          joy
## 38552               pay     positive
## 38553               pay        trust
## 38554           charity          joy
## 38555           charity     positive
## 38556        prosperity     positive
## 38557          faithful     positive
## 38558          faithful        trust
## 38559        perversion        anger
## 38560        perversion      disgust
## 38561        perversion     negative
## 38562        perversion      sadness
## 38563               sky     positive
## 38564           attempt anticipation
## 38565          preserve     positive
## 38566             toxic      disgust
## 38567             toxic     negative
## 38568               sky     positive
## 38569            ardent anticipation
## 38570            ardent          joy
## 38571            ardent     positive
## 38572            ardent anticipation
## 38573            ardent          joy
## 38574            ardent     positive
## 38575          religion        trust
## 38576               don     positive
## 38577               don        trust
## 38578          religion        trust
## 38579              lack     negative
## 38580     understanding     positive
## 38581     understanding        trust
## 38582      intelligence         fear
## 38583      intelligence          joy
## 38584      intelligence     positive
## 38585      intelligence        trust
## 38586        aggression        anger
## 38587        aggression         fear
## 38588        aggression     negative
## 38589          rigidity     negative
## 38590         toughness        anger
## 38591         toughness         fear
## 38592         toughness     positive
## 38593         toughness        trust
## 38594       undesirable        anger
## 38595       undesirable      disgust
## 38596       undesirable         fear
## 38597       undesirable     negative
## 38598       undesirable      sadness
## 38599          religion        trust
## 38600            taught        trust
## 38601              fair     positive
## 38602             agree     positive
## 38603        strikingly     positive
## 38604          cautious anticipation
## 38605          cautious         fear
## 38606          cautious     positive
## 38607          cautious        trust
## 38608          religion        trust
## 38609            result anticipation
## 38610            result anticipation
## 38611          insecure        anger
## 38612          insecure         fear
## 38613          insecure     negative
## 38614          insecure      sadness
## 38615           anxious anticipation
## 38616           anxious         fear
## 38617           anxious     negative
## 38618        attachment     positive
## 38619        hypothesis anticipation
## 38620        hypothesis     surprise
## 38621    indoctrination        anger
## 38622    indoctrination         fear
## 38623    indoctrination     negative
## 38624             child anticipation
## 38625             child          joy
## 38626             child     positive
## 38627            church anticipation
## 38628            church          joy
## 38629            church     positive
## 38630            church        trust
## 38631          religion        trust
## 38632           chicken         fear
## 38633               god anticipation
## 38634               god         fear
## 38635               god          joy
## 38636               god     positive
## 38637               god        trust
## 38638          powerful        anger
## 38639          powerful anticipation
## 38640          powerful      disgust
## 38641          powerful         fear
## 38642          powerful          joy
## 38643          powerful     positive
## 38644          powerful        trust
## 38645            create          joy
## 38646            create     positive
## 38647            change         fear
## 38648              real     positive
## 38649              real        trust
## 38650          question     positive
## 38651          personal        trust
## 38652           rejects        anger
## 38653           rejects         fear
## 38654           rejects     negative
## 38655           rejects      sadness
## 38656        completely     positive
## 38657           rejects        anger
## 38658           rejects         fear
## 38659           rejects     negative
## 38660           rejects      sadness
## 38661        completely     positive
## 38662            proven        trust
## 38663              heal          joy
## 38664              heal     positive
## 38665              heal        trust
## 38666            system        trust
## 38667             start anticipation
## 38668             alive anticipation
## 38669             alive          joy
## 38670             alive     positive
## 38671             alive        trust
## 38672              time anticipation
## 38673               hit        anger
## 38674               hit     negative
## 38675              rock     positive
## 38676            bottom     negative
## 38677            bottom      sadness
## 38678           account        trust
## 38679            change         fear
## 38680            happen anticipation
## 38681             worry anticipation
## 38682             worry         fear
## 38683             worry     negative
## 38684             worry      sadness
## 38685            change         fear
## 38686             death        anger
## 38687             death anticipation
## 38688             death      disgust
## 38689             death         fear
## 38690             death     negative
## 38691             death      sadness
## 38692             death     surprise
## 38693              cult         fear
## 38694              cult     negative
## 38695            reward anticipation
## 38696            reward          joy
## 38697            reward     positive
## 38698            reward     surprise
## 38699            reward        trust
## 38700               die         fear
## 38701               die     negative
## 38702               die      sadness
## 38703              shit        anger
## 38704              shit      disgust
## 38705              shit     negative
## 38706             leave     negative
## 38707             leave      sadness
## 38708             leave     surprise
## 38709           denying anticipation
## 38710           denying     negative
## 38711          believed        trust
## 38712             weird      disgust
## 38713             weird     negative
## 38714          nihilism     negative
## 38715              talk     positive
## 38716               god anticipation
## 38717               god         fear
## 38718               god          joy
## 38719               god     positive
## 38720               god        trust
## 38721               god anticipation
## 38722               god         fear
## 38723               god          joy
## 38724               god     positive
## 38725               god        trust
## 38726               god anticipation
## 38727               god         fear
## 38728               god          joy
## 38729               god     positive
## 38730               god        trust
## 38731              time anticipation
## 38732              fire         fear
## 38733              flop      disgust
## 38734              flop     negative
## 38735              flop      sadness
## 38736            change         fear
## 38737             wrong     negative
## 38738            forget     negative
## 38739               god anticipation
## 38740               god         fear
## 38741               god          joy
## 38742               god     positive
## 38743               god        trust
## 38744          humanity          joy
## 38745          humanity     positive
## 38746          humanity        trust
## 38747              damn        anger
## 38748              damn      disgust
## 38749              damn     negative
## 38750               god anticipation
## 38751               god         fear
## 38752               god          joy
## 38753               god     positive
## 38754               god        trust
## 38755              fear        anger
## 38756              fear         fear
## 38757              fear     negative
## 38758            change         fear
## 38759               god anticipation
## 38760               god         fear
## 38761               god          joy
## 38762               god     positive
## 38763               god        trust
## 38764              real     positive
## 38765              real        trust
## 38766            change         fear
## 38767           denying anticipation
## 38768           denying     negative
## 38769              true          joy
## 38770              true     positive
## 38771              true        trust
## 38772               god anticipation
## 38773               god         fear
## 38774               god          joy
## 38775               god     positive
## 38776               god        trust
## 38777            create          joy
## 38778            create     positive
## 38779            change         fear
## 38780            change         fear
## 38781             faith anticipation
## 38782             faith          joy
## 38783             faith     positive
## 38784             faith        trust
## 38785            reason     positive
## 38786              base        trust
## 38787          powerful        anger
## 38788          powerful anticipation
## 38789          powerful      disgust
## 38790          powerful         fear
## 38791          powerful          joy
## 38792          powerful     positive
## 38793          powerful        trust
## 38794               god anticipation
## 38795               god         fear
## 38796               god          joy
## 38797               god     positive
## 38798               god        trust
## 38799           extinct     negative
## 38800           extinct      sadness
## 38801               god anticipation
## 38802               god         fear
## 38803               god          joy
## 38804               god     positive
## 38805               god        trust
## 38806         evolution     positive
## 38807               die         fear
## 38808               die     negative
## 38809               die      sadness
## 38810              late     negative
## 38811              late      sadness
## 38812            honest        anger
## 38813            honest      disgust
## 38814            honest         fear
## 38815            honest          joy
## 38816            honest     positive
## 38817            honest      sadness
## 38818            honest        trust
## 38819            reason     positive
## 38820              deal anticipation
## 38821              deal          joy
## 38822              deal     positive
## 38823              deal     surprise
## 38824              deal        trust
## 38825             dying        anger
## 38826             dying      disgust
## 38827             dying         fear
## 38828             dying     negative
## 38829             dying      sadness
## 38830            change         fear
## 38831             faith anticipation
## 38832             faith          joy
## 38833             faith     positive
## 38834             faith        trust
## 38835             faith anticipation
## 38836             faith          joy
## 38837             faith     positive
## 38838             faith        trust
## 38839             wrong     negative
## 38840             faith anticipation
## 38841             faith          joy
## 38842             faith     positive
## 38843             faith        trust
## 38844            stupid     negative
## 38845            stupid     negative
## 38846        supporting     positive
## 38847        supporting        trust
## 38848          powerful        anger
## 38849          powerful anticipation
## 38850          powerful      disgust
## 38851          powerful         fear
## 38852          powerful          joy
## 38853          powerful     positive
## 38854          powerful        trust
## 38855            bottom     negative
## 38856            bottom      sadness
## 38857             start anticipation
## 38858              cult         fear
## 38859              cult     negative
## 38860             faith anticipation
## 38861             faith          joy
## 38862             faith     positive
## 38863             faith        trust
## 38864              true          joy
## 38865              true     positive
## 38866              true        trust
## 38867        conspiracy         fear
## 38868            public anticipation
## 38869            public     positive
## 38870           worship anticipation
## 38871           worship         fear
## 38872           worship          joy
## 38873           worship     positive
## 38874           worship        trust
## 38875            sinful        anger
## 38876            sinful      disgust
## 38877            sinful         fear
## 38878            sinful     negative
## 38879            sinful      sadness
## 38880              time anticipation
## 38881            change         fear
## 38882              real     positive
## 38883              real        trust
## 38884              cult         fear
## 38885              cult     negative
## 38886       susceptible     negative
## 38887           liberal     negative
## 38888           liberal     positive
## 38889              love          joy
## 38890              love     positive
## 38891             trump     surprise
## 38892           leaning        trust
## 38893           despise        anger
## 38894           despise      disgust
## 38895           despise     negative
## 38896              hate        anger
## 38897              hate      disgust
## 38898              hate         fear
## 38899              hate     negative
## 38900              hate      sadness
## 38901              love          joy
## 38902              love     positive
## 38903              jump          joy
## 38904              jump     positive
## 38905            change         fear
## 38906               god anticipation
## 38907               god         fear
## 38908               god          joy
## 38909               god     positive
## 38910               god        trust
## 38911          dominion         fear
## 38912          dominion        trust
## 38913           happily          joy
## 38914           happily     positive
## 38915              lose        anger
## 38916              lose      disgust
## 38917              lose         fear
## 38918              lose     negative
## 38919              lose      sadness
## 38920              lose     surprise
## 38921             money        anger
## 38922             money anticipation
## 38923             money          joy
## 38924             money     positive
## 38925             money     surprise
## 38926             money        trust
## 38927          friendly anticipation
## 38928          friendly          joy
## 38929          friendly     positive
## 38930          friendly        trust
## 38931              gold     positive
## 38932              fake     negative
## 38933             wrong     negative
## 38934         evolution     positive
## 38935             wrong     negative
## 38936            change         fear
## 38937         evolution     positive
## 38938            denial     negative
## 38939          doubting     negative
## 38940        conspiracy         fear
## 38941              lack     negative
## 38942            church anticipation
## 38943            church          joy
## 38944            church     positive
## 38945            church        trust
## 38946            change         fear
## 38947           heavily     negative
## 38948            damage        anger
## 38949            damage      disgust
## 38950            damage     negative
## 38951            damage      sadness
## 38952             truth     positive
## 38953             truth        trust
## 38954             sense     positive
## 38955          morality     positive
## 38956          morality        trust
## 38957             moral        anger
## 38958             moral     positive
## 38959             moral        trust
## 38960             moral        anger
## 38961             moral     positive
## 38962             moral        trust
## 38963             moral        anger
## 38964             moral     positive
## 38965             moral        trust
## 38966             moral        anger
## 38967             moral     positive
## 38968             moral        trust
## 38969             trump     surprise
## 38970            excuse     negative
## 38971            excuse     negative
## 38972          accurate     positive
## 38973          accurate        trust
## 38974              evil        anger
## 38975              evil      disgust
## 38976              evil         fear
## 38977              evil     negative
## 38978              evil      sadness
## 38979         socialist        anger
## 38980         socialist      disgust
## 38981         socialist         fear
## 38982         socialist     negative
## 38983         socialist      sadness
## 38984            action     positive
## 38985        opposition        anger
## 38986        opposition     negative
## 38987             moral        anger
## 38988             moral     positive
## 38989             moral        trust
## 38990            action     positive
## 38991              evil        anger
## 38992              evil      disgust
## 38993              evil         fear
## 38994              evil     negative
## 38995              evil      sadness
## 38996          tripping        anger
## 38997          tripping     negative
## 38998          tripping      sadness
## 38999          morality     positive
## 39000          morality        trust
## 39001              evil        anger
## 39002              evil      disgust
## 39003              evil         fear
## 39004              evil     negative
## 39005              evil      sadness
## 39006              evil        anger
## 39007              evil      disgust
## 39008              evil         fear
## 39009              evil     negative
## 39010              evil      sadness
## 39011              evil        anger
## 39012              evil      disgust
## 39013              evil         fear
## 39014              evil     negative
## 39015              evil      sadness
## 39016              evil        anger
## 39017              evil      disgust
## 39018              evil         fear
## 39019              evil     negative
## 39020              evil      sadness
## 39021             agree     positive
## 39022         hilarious          joy
## 39023         hilarious     positive
## 39024         hilarious     surprise
## 39025            church anticipation
## 39026            church          joy
## 39027            church     positive
## 39028            church        trust
## 39029            fairly     positive
## 39030            fairly        trust
## 39031           blatant        anger
## 39032           blatant      disgust
## 39033           blatant     negative
## 39034           illegal        anger
## 39035           illegal      disgust
## 39036           illegal         fear
## 39037           illegal     negative
## 39038           illegal      sadness
## 39039               don     positive
## 39040               don        trust
## 39041            change         fear
## 39042              hoax        anger
## 39043              hoax      disgust
## 39044              hoax     negative
## 39045              hoax      sadness
## 39046              hoax     surprise
## 39047          continue anticipation
## 39048          continue     positive
## 39049          continue        trust
## 39050             money        anger
## 39051             money anticipation
## 39052             money          joy
## 39053             money     positive
## 39054             money     surprise
## 39055             money        trust
## 39056       grandfather        trust
## 39057            change         fear
## 39058               god anticipation
## 39059               god         fear
## 39060               god          joy
## 39061               god     positive
## 39062               god        trust
## 39063               sin        anger
## 39064               sin      disgust
## 39065               sin         fear
## 39066               sin     negative
## 39067               sin      sadness
## 39068              fire         fear
## 39069            sinful        anger
## 39070            sinful      disgust
## 39071            sinful         fear
## 39072            sinful     negative
## 39073            sinful      sadness
## 39074          freezing     negative
## 39075            sinful        anger
## 39076            sinful      disgust
## 39077            sinful         fear
## 39078            sinful     negative
## 39079            sinful      sadness
## 39080               god anticipation
## 39081               god         fear
## 39082               god          joy
## 39083               god     positive
## 39084               god        trust
## 39085       grandfather        trust
## 39086           asshole        anger
## 39087           asshole      disgust
## 39088           asshole     negative
## 39089               god anticipation
## 39090               god         fear
## 39091               god          joy
## 39092               god     positive
## 39093               god        trust
## 39094               god anticipation
## 39095               god         fear
## 39096               god          joy
## 39097               god     positive
## 39098               god        trust
## 39099           rapture anticipation
## 39100           rapture          joy
## 39101           rapture     positive
## 39102           hateful        anger
## 39103           hateful      disgust
## 39104           hateful         fear
## 39105           hateful     negative
## 39106           hateful      sadness
## 39107           bigoted        anger
## 39108           bigoted      disgust
## 39109           bigoted         fear
## 39110           bigoted     negative
## 39111           bigoted      sadness
## 39112     disrespectful        anger
## 39113     disrespectful      disgust
## 39114     disrespectful         fear
## 39115     disrespectful     negative
## 39116     disrespectful      sadness
## 39117             quiet     positive
## 39118             quiet      sadness
## 39119     disrespectful        anger
## 39120     disrespectful      disgust
## 39121     disrespectful         fear
## 39122     disrespectful     negative
## 39123     disrespectful      sadness
## 39124              time anticipation
## 39125           medical anticipation
## 39126           medical         fear
## 39127           medical     positive
## 39128           medical        trust
## 39129     disrespectful        anger
## 39130     disrespectful      disgust
## 39131     disrespectful         fear
## 39132     disrespectful     negative
## 39133     disrespectful      sadness
## 39134             quiet     positive
## 39135             quiet      sadness
## 39136            change         fear
## 39137            degree     positive
## 39138              hate        anger
## 39139              hate      disgust
## 39140              hate         fear
## 39141              hate     negative
## 39142              hate      sadness
## 39143             bleak     negative
## 39144             bleak      sadness
## 39145               god anticipation
## 39146               god         fear
## 39147               god          joy
## 39148               god     positive
## 39149               god        trust
## 39150            happen anticipation
## 39151             lying        anger
## 39152             lying      disgust
## 39153             lying     negative
## 39154               god anticipation
## 39155               god         fear
## 39156               god          joy
## 39157               god     positive
## 39158               god        trust
## 39159              kill         fear
## 39160              kill     negative
## 39161              kill      sadness
## 39162              sick      disgust
## 39163              sick     negative
## 39164              sick      sadness
## 39165               god anticipation
## 39166               god         fear
## 39167               god          joy
## 39168               god     positive
## 39169               god        trust
## 39170          pinnacle     positive
## 39171               god anticipation
## 39172               god         fear
## 39173               god          joy
## 39174               god     positive
## 39175               god        trust
## 39176           steward     positive
## 39177           steward        trust
## 39178               god anticipation
## 39179               god         fear
## 39180               god          joy
## 39181               god     positive
## 39182               god        trust
## 39183             flood         fear
## 39184              fire         fear
## 39185            change         fear
## 39186            coming anticipation
## 39187         including     positive
## 39188        government         fear
## 39189        government     negative
## 39190          ultimate anticipation
## 39191          ultimate      sadness
## 39192              plan anticipation
## 39193            heresy     negative
## 39194              lack     negative
## 39195             trust        trust
## 39196               god anticipation
## 39197               god         fear
## 39198               god          joy
## 39199               god     positive
## 39200               god        trust
## 39201              save          joy
## 39202              save     positive
## 39203              save        trust
## 39204             spent     negative
## 39205             dying        anger
## 39206             dying      disgust
## 39207             dying         fear
## 39208             dying     negative
## 39209             dying      sadness
## 39210        opposition        anger
## 39211        opposition     negative
## 39212               die         fear
## 39213               die     negative
## 39214               die      sadness
## 39215              hate        anger
## 39216              hate      disgust
## 39217              hate         fear
## 39218              hate     negative
## 39219              hate      sadness
## 39220              love          joy
## 39221              love     positive
## 39222              time anticipation
## 39223           hunting        anger
## 39224           hunting anticipation
## 39225           hunting         fear
## 39226           hunting     negative
## 39227            refuse     negative
## 39228             giant         fear
## 39229          guzzling     negative
## 39230           killing        anger
## 39231           killing         fear
## 39232           killing     negative
## 39233           killing      sadness
## 39234        uneducated     negative
## 39235        uneducated      sadness
## 39236          ignorant      disgust
## 39237          ignorant     negative
## 39238            greedy      disgust
## 39239            greedy     negative
## 39240           ability     positive
## 39241           maximum     positive
## 39242              deal anticipation
## 39243              deal          joy
## 39244              deal     positive
## 39245              deal     surprise
## 39246              deal        trust
## 39247           perfect anticipation
## 39248           perfect          joy
## 39249           perfect     positive
## 39250           perfect        trust
## 39251          continue anticipation
## 39252          continue     positive
## 39253          continue        trust
## 39254            change         fear
## 39255          continue anticipation
## 39256          continue     positive
## 39257          continue        trust
## 39258           extinct     negative
## 39259           extinct      sadness
## 39260               die         fear
## 39261               die     negative
## 39262               die      sadness
## 39263              heal          joy
## 39264              heal     positive
## 39265              heal        trust
## 39266            change         fear
## 39267             moral        anger
## 39268             moral     positive
## 39269             moral        trust
## 39270             fight        anger
## 39271             fight         fear
## 39272             fight     negative
## 39273            change         fear
## 39274          fighting        anger
## 39275          fighting     negative
## 39276            change         fear
## 39277        government         fear
## 39278        government     negative
## 39279        government         fear
## 39280        government     negative
## 39281         communism        anger
## 39282         communism         fear
## 39283         communism     negative
## 39284         communism      sadness
## 39285         communism        anger
## 39286         communism         fear
## 39287         communism     negative
## 39288         communism      sadness
## 39289            change         fear
## 39290           suspect         fear
## 39291           suspect     negative
## 39292             crazy        anger
## 39293             crazy         fear
## 39294             crazy     negative
## 39295             crazy      sadness
## 39296            change         fear
## 39297            denial     negative
## 39298            rooted     positive
## 39299            rooted        trust
## 39300            unholy         fear
## 39301            unholy     negative
## 39302          marriage anticipation
## 39303          marriage          joy
## 39304          marriage     positive
## 39305          marriage        trust
## 39306            actual     positive
## 39307         including     positive
## 39308               gun        anger
## 39309               gun         fear
## 39310               gun     negative
## 39311         supremacy        anger
## 39312         supremacy anticipation
## 39313         supremacy         fear
## 39314         supremacy          joy
## 39315         supremacy     negative
## 39316         supremacy     positive
## 39317         supremacy     surprise
## 39318         supremacy        trust
## 39319              time anticipation
## 39320            change         fear
## 39321            unable     negative
## 39322            unable      sadness
## 39323               god anticipation
## 39324               god         fear
## 39325               god          joy
## 39326               god     positive
## 39327               god        trust
## 39328              time anticipation
## 39329            coming anticipation
## 39330              bear        anger
## 39331              bear         fear
## 39332         attacking        anger
## 39333         attacking      disgust
## 39334         attacking         fear
## 39335         attacking     negative
## 39336         attacking      sadness
## 39337         attacking     surprise
## 39338               don     positive
## 39339               don        trust
## 39340             thief        anger
## 39341             thief      disgust
## 39342             thief         fear
## 39343             thief     negative
## 39344             thief      sadness
## 39345             thief     surprise
## 39346              base        trust
## 39347           foreign     negative
## 39348            public anticipation
## 39349            public     positive
## 39350            policy        trust
## 39351            change         fear
## 39352               sun anticipation
## 39353               sun          joy
## 39354               sun     positive
## 39355               sun     surprise
## 39356               sun        trust
## 39357               god anticipation
## 39358               god         fear
## 39359               god          joy
## 39360               god     positive
## 39361               god        trust
## 39362             major     positive
## 39363               war         fear
## 39364               war     negative
## 39365        accelerate anticipation
## 39366              gift anticipation
## 39367              gift          joy
## 39368              gift     positive
## 39369              gift     surprise
## 39370               god anticipation
## 39371               god         fear
## 39372               god          joy
## 39373               god     positive
## 39374               god        trust
## 39375        protecting     positive
## 39376        protecting        trust
## 39377             flood         fear
## 39378               god anticipation
## 39379               god         fear
## 39380               god          joy
## 39381               god     positive
## 39382               god        trust
## 39383             nasty        anger
## 39384             nasty      disgust
## 39385             nasty         fear
## 39386             nasty     negative
## 39387             nasty      sadness
## 39388           satanic        anger
## 39389           satanic     negative
## 39390             flood         fear
## 39391               god anticipation
## 39392               god         fear
## 39393               god          joy
## 39394               god     positive
## 39395               god        trust
## 39396             flood         fear
## 39397            change         fear
## 39398            rising anticipation
## 39399            rising          joy
## 39400            rising     positive
## 39401               sea     positive
## 39402          fruitful     positive
## 39403            action     positive
## 39404            coming anticipation
## 39405             clean          joy
## 39406             clean     positive
## 39407             clean        trust
## 39408            attack        anger
## 39409            attack         fear
## 39410            attack     negative
## 39411             faith anticipation
## 39412             faith          joy
## 39413             faith     positive
## 39414             faith        trust
## 39415           attempt anticipation
## 39416              evil        anger
## 39417              evil      disgust
## 39418              evil         fear
## 39419              evil     negative
## 39420              evil      sadness
## 39421              plan anticipation
## 39422               god anticipation
## 39423               god         fear
## 39424               god          joy
## 39425               god     positive
## 39426               god        trust
## 39427           missing         fear
## 39428           missing     negative
## 39429           missing      sadness
## 39430            stupid     negative
## 39431              gore        anger
## 39432              gore      disgust
## 39433              gore         fear
## 39434              gore     negative
## 39435              gore      sadness
## 39436            change         fear
## 39437              gift anticipation
## 39438              gift          joy
## 39439              gift     positive
## 39440              gift     surprise
## 39441               god anticipation
## 39442               god         fear
## 39443               god          joy
## 39444               god     positive
## 39445               god        trust
## 39446            change         fear
## 39447           perfect anticipation
## 39448           perfect          joy
## 39449           perfect     positive
## 39450           perfect        trust
## 39451          avoiding         fear
## 39452            motive     positive
## 39453            happen anticipation
## 39454              pope     positive
## 39455            tackle        anger
## 39456            tackle     surprise
## 39457            change         fear
## 39458              pope     positive
## 39459            appeal anticipation
## 39460              true          joy
## 39461              true     positive
## 39462              true        trust
## 39463            ignore     negative
## 39464             faith anticipation
## 39465             faith          joy
## 39466             faith     positive
## 39467             faith        trust
## 39468             doubt         fear
## 39469             doubt     negative
## 39470             doubt      sadness
## 39471             doubt        trust
## 39472             death        anger
## 39473             death anticipation
## 39474             death      disgust
## 39475             death         fear
## 39476             death     negative
## 39477             death      sadness
## 39478             death     surprise
## 39479              cult         fear
## 39480              cult     negative
## 39481            change         fear
## 39482            happen anticipation
## 39483             death        anger
## 39484             death anticipation
## 39485             death      disgust
## 39486             death         fear
## 39487             death     negative
## 39488             death      sadness
## 39489             death     surprise
## 39490              cult         fear
## 39491              cult     negative
## 39492            subdue     negative
## 39493            change         fear
## 39494            notion     positive
## 39495      collectively     positive
## 39496      collectively        trust
## 39497           ability     positive
## 39498               god anticipation
## 39499               god         fear
## 39500               god          joy
## 39501               god     positive
## 39502               god        trust
## 39503             major     positive
## 39504            change         fear
## 39505       electricity     positive
## 39506            united     positive
## 39507            united        trust
## 39508            employ        trust
## 39509        production anticipation
## 39510        production     positive
## 39511             truck        trust
## 39512             truck        trust
## 39513              harm         fear
## 39514              harm     negative
## 39515            change         fear
## 39516            denial     negative
## 39517              lack     negative
## 39518          religion        trust
## 39519              deny        anger
## 39520              deny     negative
## 39521            change         fear
## 39522          religion        trust
## 39523            denial     negative
## 39524              fear        anger
## 39525              fear         fear
## 39526              fear     negative
## 39527            losing        anger
## 39528            losing     negative
## 39529            losing      sadness
## 39530             worth     positive
## 39531              loss        anger
## 39532              loss         fear
## 39533              loss     negative
## 39534              loss      sadness
## 39535           account        trust
## 39536           economy        trust
## 39537            govern     positive
## 39538            govern        trust
## 39539            expect anticipation
## 39540            expect     positive
## 39541            expect     surprise
## 39542            expect        trust
## 39543              lose        anger
## 39544              lose      disgust
## 39545              lose         fear
## 39546              lose     negative
## 39547              lose      sadness
## 39548              lose     surprise
## 39549            hungry anticipation
## 39550            hungry     negative
## 39551         desperate     negative
## 39552            afford     positive
## 39553              lose        anger
## 39554              lose      disgust
## 39555              lose         fear
## 39556              lose     negative
## 39557              lose      sadness
## 39558              lose     surprise
## 39559            decent     positive
## 39560             fault     negative
## 39561             fault      sadness
## 39562            change         fear
## 39563          solution     positive
## 39564               job     positive
## 39565             learn     positive
## 39566              lead     positive
## 39567            change         fear
## 39568              lose        anger
## 39569              lose      disgust
## 39570              lose         fear
## 39571              lose     negative
## 39572              lose      sadness
## 39573              lose     surprise
## 39574               job     positive
## 39575               job     positive
## 39576        compensate anticipation
## 39577        compensate          joy
## 39578        compensate     positive
## 39579        compensate     surprise
## 39580        compensate        trust
## 39581            career anticipation
## 39582            career     positive
## 39583              pill     positive
## 39584              pill        trust
## 39585            change         fear
## 39586               god anticipation
## 39587               god         fear
## 39588               god          joy
## 39589               god     positive
## 39590               god        trust
## 39591            demise         fear
## 39592            demise     negative
## 39593            demise      sadness
## 39594          argument        anger
## 39595          argument     negative
## 39596               god anticipation
## 39597               god         fear
## 39598               god          joy
## 39599               god     positive
## 39600               god        trust
## 39601            change         fear
## 39602          conflict        anger
## 39603          conflict         fear
## 39604          conflict     negative
## 39605          conflict      sadness
## 39606          religion        trust
## 39607        compliance     positive
## 39608        compliance        trust
## 39609        opposition        anger
## 39610        opposition     negative
## 39611        contradict        anger
## 39612        contradict     negative
## 39613            oppose     negative
## 39614          abortion      disgust
## 39615          abortion         fear
## 39616          abortion     negative
## 39617          abortion      sadness
## 39618              save          joy
## 39619              save     positive
## 39620              save        trust
## 39621     contradiction     negative
## 39622             lines         fear
## 39623              true          joy
## 39624              true     positive
## 39625              true        trust
## 39626         righteous     positive
## 39627              real     positive
## 39628              real        trust
## 39629            action     positive
## 39630          abortion      disgust
## 39631          abortion         fear
## 39632          abortion     negative
## 39633          abortion      sadness
## 39634            change         fear
## 39635        completely     positive
## 39636          continue anticipation
## 39637          continue     positive
## 39638          continue        trust
## 39639            status     positive
## 39640            coming anticipation
## 39641               god anticipation
## 39642               god         fear
## 39643               god          joy
## 39644               god     positive
## 39645               god        trust
## 39646           rapture anticipation
## 39647           rapture          joy
## 39648           rapture     positive
## 39649               god anticipation
## 39650               god         fear
## 39651               god          joy
## 39652               god     positive
## 39653               god        trust
## 39654             trash      disgust
## 39655             trash     negative
## 39656             trash      sadness
## 39657             trash      disgust
## 39658             trash     negative
## 39659             trash      sadness
## 39660          powerful        anger
## 39661          powerful anticipation
## 39662          powerful      disgust
## 39663          powerful         fear
## 39664          powerful          joy
## 39665          powerful     positive
## 39666          powerful        trust
## 39667       susceptible     negative
## 39668         believing     positive
## 39669         believing        trust
## 39670            change         fear
## 39671       susceptible     negative
## 39672             death        anger
## 39673             death anticipation
## 39674             death      disgust
## 39675             death         fear
## 39676             death     negative
## 39677             death      sadness
## 39678             death     surprise
## 39679              cult         fear
## 39680              cult     negative
## 39681              true          joy
## 39682              true     positive
## 39683              true        trust
## 39684            change         fear
## 39685           rapture anticipation
## 39686           rapture          joy
## 39687           rapture     positive
## 39688            chosen     positive
## 39689             death        anger
## 39690             death anticipation
## 39691             death      disgust
## 39692             death         fear
## 39693             death     negative
## 39694             death      sadness
## 39695             death     surprise
## 39696              cult         fear
## 39697              cult     negative
## 39698             agree     positive
## 39699            change         fear
## 39700            denial     negative
## 39701           denying anticipation
## 39702           denying     negative
## 39703            change         fear
## 39704              deny        anger
## 39705              deny     negative
## 39706               god anticipation
## 39707               god         fear
## 39708               god          joy
## 39709               god     positive
## 39710               god        trust
## 39711             wrong     negative
## 39712          accurate     positive
## 39713          accurate        trust
## 39714         believing     positive
## 39715         believing        trust
## 39716          lobbyist     negative
## 39717             money        anger
## 39718             money anticipation
## 39719             money          joy
## 39720             money     positive
## 39721             money     surprise
## 39722             money        trust
## 39723              vote        anger
## 39724              vote anticipation
## 39725              vote          joy
## 39726              vote     negative
## 39727              vote     positive
## 39728              vote      sadness
## 39729              vote     surprise
## 39730              vote        trust
## 39731            leader     positive
## 39732            leader        trust
## 39733           provide     positive
## 39734           provide        trust
## 39735            losing        anger
## 39736            losing     negative
## 39737            losing      sadness
## 39738           diverse     negative
## 39739           diverse     positive
## 39740        scientific     positive
## 39741        scientific        trust
## 39742           finally anticipation
## 39743           finally      disgust
## 39744           finally          joy
## 39745           finally     positive
## 39746           finally     surprise
## 39747           finally        trust
## 39748             agree     positive
## 39749              real     positive
## 39750              real        trust
## 39751             wrath        anger
## 39752             wrath         fear
## 39753             wrath     negative
## 39754             cater     positive
## 39755              time anticipation
## 39756          personal        trust
## 39757         resistant         fear
## 39758         resistant     negative
## 39759            change         fear
## 39760           heavily     negative
## 39761           loyalty     positive
## 39762           loyalty        trust
## 39763              deal anticipation
## 39764              deal          joy
## 39765              deal     positive
## 39766              deal     surprise
## 39767              deal        trust
## 39768            change         fear
## 39769          argument        anger
## 39770          argument     negative
## 39771           economy        trust
## 39772             agree     positive
## 39773              fear        anger
## 39774              fear         fear
## 39775              fear     negative
## 39776            change         fear
## 39777            change         fear
## 39778            denial     negative
## 39779         resistant         fear
## 39780         resistant     negative
## 39781            change         fear
## 39782          religion        trust
## 39783           fulfill          joy
## 39784           fulfill     positive
## 39785            happen anticipation
## 39786              rest     positive
## 39787      entertaining anticipation
## 39788      entertaining          joy
## 39789      entertaining     positive
## 39790            change         fear
## 39791            change         fear
## 39792               don     positive
## 39793               don        trust
## 39794             worry anticipation
## 39795             worry         fear
## 39796             worry     negative
## 39797             worry      sadness
## 39798          tomorrow anticipation
## 39799            priest     positive
## 39800            priest        trust
## 39801          religion        trust
## 39802             sense     positive
## 39803          personal        trust
## 39804               god anticipation
## 39805               god         fear
## 39806               god          joy
## 39807               god     positive
## 39808               god        trust
## 39809               god anticipation
## 39810               god         fear
## 39811               god          joy
## 39812               god     positive
## 39813               god        trust
## 39814               bad        anger
## 39815               bad      disgust
## 39816               bad         fear
## 39817               bad     negative
## 39818               bad      sadness
## 39819             devil        anger
## 39820             devil anticipation
## 39821             devil      disgust
## 39822             devil         fear
## 39823             devil     negative
## 39824             devil      sadness
## 39825    accountability     positive
## 39826    accountability        trust
## 39827           stomach      disgust
## 39828            change         fear
## 39829               god anticipation
## 39830               god         fear
## 39831               god          joy
## 39832               god     positive
## 39833               god        trust
## 39834           worship anticipation
## 39835           worship         fear
## 39836           worship          joy
## 39837           worship     positive
## 39838           worship        trust
## 39839               god anticipation
## 39840               god         fear
## 39841               god          joy
## 39842               god     positive
## 39843               god        trust
## 39844               god anticipation
## 39845               god         fear
## 39846               god          joy
## 39847               god     positive
## 39848               god        trust
## 39849              shit        anger
## 39850              shit      disgust
## 39851              shit     negative
## 39852               god anticipation
## 39853               god         fear
## 39854               god          joy
## 39855               god     positive
## 39856               god        trust
## 39857           magical anticipation
## 39858           magical          joy
## 39859           magical     positive
## 39860           magical     surprise
## 39861              shit        anger
## 39862              shit      disgust
## 39863              shit     negative
## 39864             leave     negative
## 39865             leave      sadness
## 39866             leave     surprise
## 39867           rapture anticipation
## 39868           rapture          joy
## 39869           rapture     positive
## 39870             toxic      disgust
## 39871             toxic     negative
## 39872             green          joy
## 39873             green     positive
## 39874             green        trust
## 39875               eat     positive
## 39876             cheap     negative
## 39877            defend         fear
## 39878            defend     positive
## 39879             level     positive
## 39880             level        trust
## 39881             wrong     negative
## 39882              lazy     negative
## 39883              lazy     negative
## 39884        playground anticipation
## 39885        playground          joy
## 39886        playground     positive
## 39887        playground     surprise
## 39888        playground        trust
## 39889              crap      disgust
## 39890              crap     negative
## 39891               god anticipation
## 39892               god         fear
## 39893               god          joy
## 39894               god     positive
## 39895               god        trust
## 39896            church anticipation
## 39897            church          joy
## 39898            church     positive
## 39899            church        trust
## 39900          blissful          joy
## 39901          blissful     positive
## 39902         ignorance     negative
## 39903            church anticipation
## 39904            church          joy
## 39905            church     positive
## 39906            church        trust
## 39907        sacrifices      disgust
## 39908        sacrifices         fear
## 39909        sacrifices     negative
## 39910        sacrifices      sadness
## 39911              lazy     negative
## 39912        resistance        anger
## 39913        resistance     negative
## 39914            church anticipation
## 39915            church          joy
## 39916            church     positive
## 39917            church        trust
## 39918          fighting        anger
## 39919          fighting     negative
## 39920              lazy     negative
## 39921           rapture anticipation
## 39922           rapture          joy
## 39923           rapture     positive
## 39924        dishonesty      disgust
## 39925        dishonesty     negative
## 39926              deny        anger
## 39927              deny     negative
## 39928            change         fear
## 39929           prevent         fear
## 39930            action     positive
## 39931              hell        anger
## 39932              hell      disgust
## 39933              hell         fear
## 39934              hell     negative
## 39935              hell      sadness
## 39936              evil        anger
## 39937              evil      disgust
## 39938              evil         fear
## 39939              evil     negative
## 39940              evil      sadness
## 39941              kill         fear
## 39942              kill     negative
## 39943              kill      sadness
## 39944          abortion      disgust
## 39945          abortion         fear
## 39946          abortion     negative
## 39947          abortion      sadness
## 39948               bad        anger
## 39949               bad      disgust
## 39950               bad         fear
## 39951               bad     negative
## 39952               bad      sadness
## 39953          leverage     positive
## 39954           promise          joy
## 39955           promise     positive
## 39956           promise        trust
## 39957             death        anger
## 39958             death anticipation
## 39959             death      disgust
## 39960             death         fear
## 39961             death     negative
## 39962             death      sadness
## 39963             death     surprise
## 39964            reward anticipation
## 39965            reward          joy
## 39966            reward     positive
## 39967            reward     surprise
## 39968            reward        trust
## 39969         asserting     positive
## 39970         asserting        trust
## 39971            chosen     positive
## 39972           harmful        anger
## 39973           harmful      disgust
## 39974           harmful         fear
## 39975           harmful     negative
## 39976           harmful      sadness
## 39977          reckless        anger
## 39978          reckless         fear
## 39979          reckless     negative
## 39980           selfish        anger
## 39981           selfish      disgust
## 39982           selfish     negative
## 39983         malicious        anger
## 39984         malicious      disgust
## 39985         malicious         fear
## 39986         malicious     negative
## 39987         malicious      sadness
## 39988            action     positive
## 39989         concerned         fear
## 39990         concerned      sadness
## 39991         suffering      disgust
## 39992         suffering         fear
## 39993         suffering     negative
## 39994         suffering      sadness
## 39995        perpetuate anticipation
## 39996           obvious     positive
## 39997           obvious        trust
## 39998          nihilism     negative
## 39999        completely     positive
## 40000        delusional        anger
## 40001        delusional         fear
## 40002        delusional     negative
## 40003        delusional        anger
## 40004        delusional         fear
## 40005        delusional     negative
## 40006          nihilism     negative
## 40007           limited        anger
## 40008           limited     negative
## 40009           limited      sadness
## 40010          religion        trust
## 40011            guilty        anger
## 40012            guilty     negative
## 40013            guilty      sadness
## 40014           worship anticipation
## 40015           worship         fear
## 40016           worship          joy
## 40017           worship     positive
## 40018           worship        trust
## 40019        discontent        anger
## 40020        discontent      disgust
## 40021        discontent         fear
## 40022        discontent     negative
## 40023        discontent      sadness
## 40024          atrocity        anger
## 40025          atrocity      disgust
## 40026          atrocity         fear
## 40027          atrocity     negative
## 40028          atrocity      sadness
## 40029       destruction        anger
## 40030       destruction     negative
## 40031            fairly     positive
## 40032            fairly        trust
## 40033           obvious     positive
## 40034           obvious        trust
## 40035            system        trust
## 40036             serve     negative
## 40037             serve        trust
## 40038       fundamental     positive
## 40039       fundamental        trust
## 40040          delusion        anger
## 40041          delusion         fear
## 40042          delusion     negative
## 40043          delusion      sadness
## 40044          delusion        anger
## 40045          delusion         fear
## 40046          delusion     negative
## 40047          delusion      sadness
## 40048            dispel     negative
## 40049            dispel      sadness
## 40050              time anticipation
## 40051           liberal     negative
## 40052           liberal     positive
## 40053            reason     positive
## 40054              real     positive
## 40055              real        trust
## 40056          commerce        trust
## 40057          humility     positive
## 40058          humility        trust
## 40059             avoid         fear
## 40060             avoid     negative
## 40061           include     positive
## 40062          religion        trust
## 40063          doomsday        anger
## 40064          doomsday anticipation
## 40065          doomsday      disgust
## 40066          doomsday         fear
## 40067          doomsday     negative
## 40068          doomsday      sadness
## 40069              cult         fear
## 40070              cult     negative
## 40071            ignore     negative
## 40072         concerned         fear
## 40073         concerned      sadness
## 40074            change         fear
## 40075            public anticipation
## 40076            public     positive
## 40077            change         fear
## 40078          religion        trust
## 40079            change         fear
## 40080             agree     positive
## 40081               god anticipation
## 40082               god         fear
## 40083               god          joy
## 40084               god     positive
## 40085               god        trust
## 40086            happen anticipation
## 40087           sarcasm        anger
## 40088           sarcasm      disgust
## 40089           sarcasm     negative
## 40090           sarcasm      sadness
## 40091              suck     negative
## 40092             badly     negative
## 40093             badly      sadness
## 40094           suicide        anger
## 40095           suicide         fear
## 40096           suicide     negative
## 40097           suicide      sadness
## 40098              hell        anger
## 40099              hell      disgust
## 40100              hell         fear
## 40101              hell     negative
## 40102              hell      sadness
## 40103           penalty        anger
## 40104           penalty         fear
## 40105           penalty     negative
## 40106           penalty      sadness
## 40107               sin        anger
## 40108               sin      disgust
## 40109               sin         fear
## 40110               sin     negative
## 40111               sin      sadness
## 40112              hope anticipation
## 40113              hope          joy
## 40114              hope     positive
## 40115              hope     surprise
## 40116              hope        trust
## 40117           rapture anticipation
## 40118           rapture          joy
## 40119           rapture     positive
## 40120            happen anticipation
## 40121          humanity          joy
## 40122          humanity     positive
## 40123          humanity        trust
## 40124         destroyed        anger
## 40125         destroyed         fear
## 40126         destroyed     negative
## 40127         destroyed      sadness
## 40128         believing     positive
## 40129         believing        trust
## 40130          religion        trust
## 40131       susceptible     negative
## 40132         believing     positive
## 40133         believing        trust
## 40134         demanding     negative
## 40135         authority     positive
## 40136         authority        trust
## 40137               god anticipation
## 40138               god         fear
## 40139               god          joy
## 40140               god     positive
## 40141               god        trust
## 40142             money        anger
## 40143             money anticipation
## 40144             money          joy
## 40145             money     positive
## 40146             money     surprise
## 40147             money        trust
## 40148              evil        anger
## 40149              evil      disgust
## 40150              evil         fear
## 40151              evil     negative
## 40152              evil      sadness
## 40153            change         fear
## 40154              time anticipation
## 40155             major     positive
## 40156               god anticipation
## 40157               god         fear
## 40158               god          joy
## 40159               god     positive
## 40160               god        trust
## 40161              bias        anger
## 40162              bias     negative
## 40163          hysteria         fear
## 40164          hysteria     negative
## 40165           prepare anticipation
## 40166           prepare     positive
## 40167          hysteria         fear
## 40168          hysteria     negative
## 40169            change         fear
## 40170      hypocritical      disgust
## 40171      hypocritical     negative
## 40172           corrupt     negative
## 40173             money        anger
## 40174             money anticipation
## 40175             money          joy
## 40176             money     positive
## 40177             money     surprise
## 40178             money        trust
## 40179               war         fear
## 40180               war     negative
## 40181           killing        anger
## 40182           killing         fear
## 40183           killing     negative
## 40184           killing      sadness
## 40185             waste      disgust
## 40186             waste     negative
## 40187              food          joy
## 40188              food     positive
## 40189              food        trust
## 40190            supply     positive
## 40191               god anticipation
## 40192               god         fear
## 40193               god          joy
## 40194               god     positive
## 40195               god        trust
## 40196              cool     positive
## 40197              love          joy
## 40198              love     positive
## 40199              hell        anger
## 40200              hell      disgust
## 40201              hell         fear
## 40202              hell     negative
## 40203              hell      sadness
## 40204            excuse     negative
## 40205               sun anticipation
## 40206               sun          joy
## 40207               sun     positive
## 40208               sun     surprise
## 40209               sun        trust
## 40210               sun anticipation
## 40211               sun          joy
## 40212               sun     positive
## 40213               sun     surprise
## 40214               sun        trust
## 40215              fate anticipation
## 40216              fate     negative
## 40217             model     positive
## 40218            forced         fear
## 40219            forced     negative
## 40220             curse        anger
## 40221             curse      disgust
## 40222             curse         fear
## 40223             curse     negative
## 40224             curse      sadness
## 40225            detest        anger
## 40226            detest      disgust
## 40227            detest     negative
## 40228         brilliant anticipation
## 40229         brilliant          joy
## 40230         brilliant     positive
## 40231         brilliant        trust
## 40232             labor anticipation
## 40233             labor          joy
## 40234             labor     positive
## 40235             labor     surprise
## 40236             labor        trust
## 40237          vehement        anger
## 40238          vehement         fear
## 40239          vehement     negative
## 40240         suspicion         fear
## 40241         suspicion     negative
## 40242            heresy     negative
## 40243           torture        anger
## 40244           torture anticipation
## 40245           torture      disgust
## 40246           torture         fear
## 40247           torture     negative
## 40248           torture      sadness
## 40249      imprisonment        anger
## 40250      imprisonment      disgust
## 40251      imprisonment         fear
## 40252      imprisonment     negative
## 40253      imprisonment      sadness
## 40254            arrest     negative
## 40255            prison        anger
## 40256            prison         fear
## 40257            prison     negative
## 40258            prison      sadness
## 40259            forced         fear
## 40260            forced     negative
## 40261             avoid         fear
## 40262             avoid     negative
## 40263            forced         fear
## 40264            forced     negative
## 40265          renounce        anger
## 40266          renounce     negative
## 40267             model     positive
## 40268            denied     negative
## 40269            denied      sadness
## 40270            change         fear
## 40271           bigoted        anger
## 40272           bigoted      disgust
## 40273           bigoted         fear
## 40274           bigoted     negative
## 40275           bigoted      sadness
## 40276              fair     positive
## 40277            church anticipation
## 40278            church          joy
## 40279            church     positive
## 40280            church        trust
## 40281              talk     positive
## 40282          question     positive
## 40283         structure     positive
## 40284         structure        trust
## 40285        population     positive
## 40286            change         fear
## 40287             fault     negative
## 40288             fault      sadness
## 40289               top anticipation
## 40290               top     positive
## 40291               top        trust
## 40292              food          joy
## 40293              food     positive
## 40294              food        trust
## 40295            status     positive
## 40296          religion        trust
## 40297            versus        anger
## 40298            versus     negative
## 40299              rest     positive
## 40300            versus        anger
## 40301            versus     negative
## 40302             dirty      disgust
## 40303             dirty     negative
## 40304          relevant     positive
## 40305          relevant        trust
## 40306          theology anticipation
## 40307          doomsday        anger
## 40308          doomsday anticipation
## 40309          doomsday      disgust
## 40310          doomsday         fear
## 40311          doomsday     negative
## 40312          doomsday      sadness
## 40313          theology anticipation
## 40314          humanity          joy
## 40315          humanity     positive
## 40316          humanity        trust
## 40317          dominion         fear
## 40318          dominion        trust
## 40319          conflict        anger
## 40320          conflict         fear
## 40321          conflict     negative
## 40322          conflict      sadness
## 40323          humanity          joy
## 40324          humanity     positive
## 40325          humanity        trust
## 40326          alliance        trust
## 40327            mutual     positive
## 40328          distrust        anger
## 40329          distrust      disgust
## 40330          distrust         fear
## 40331          distrust     negative
## 40332        government         fear
## 40333        government     negative
## 40334         hindrance     negative
## 40335        prosperity     positive
## 40336        antichrist        anger
## 40337        antichrist      disgust
## 40338        antichrist         fear
## 40339        antichrist     negative
## 40340               tax     negative
## 40341               tax      sadness
## 40342              food          joy
## 40343              food     positive
## 40344              food        trust
## 40345         inspector     positive
## 40346            change         fear
## 40347       cooperation     positive
## 40348       cooperation        trust
## 40349        government         fear
## 40350        government     negative
## 40351      interference     negative
## 40352            system        trust
## 40353            change         fear
## 40354              real     positive
## 40355              real        trust
## 40356       theological        trust
## 40357          theology anticipation
## 40358              word     positive
## 40359              word        trust
## 40360          accurate     positive
## 40361          accurate        trust
## 40362          prophecy anticipation
## 40363             moral        anger
## 40364             moral     positive
## 40365             moral        trust
## 40366          collapse      disgust
## 40367          collapse         fear
## 40368          collapse     negative
## 40369          collapse      sadness
## 40370            change         fear
## 40371              real     positive
## 40372              real        trust
## 40373             crazy        anger
## 40374             crazy         fear
## 40375             crazy     negative
## 40376             crazy      sadness
## 40377              fall     negative
## 40378              fall      sadness
## 40379            resist     negative
## 40380            reject        anger
## 40381            reject         fear
## 40382            reject     negative
## 40383            reject      sadness
## 40384        technology     positive
## 40385           heavily     negative
## 40386         evolution     positive
## 40387              time anticipation
## 40388              deny        anger
## 40389              deny     negative
## 40390         existence     positive
## 40391            change         fear
## 40392            refuse     negative
## 40393         existence     positive
## 40394          politics        anger
## 40395           rapture anticipation
## 40396           rapture          joy
## 40397           rapture     positive
## 40398            happen anticipation
## 40399              plan anticipation
## 40400          politics        anger
## 40401         influence     negative
## 40402         influence     positive
## 40403            change         fear
## 40404            denied     negative
## 40405            denied      sadness
## 40406           obvious     positive
## 40407           obvious        trust
## 40408            hippie     negative
## 40409              crap      disgust
## 40410              crap     negative
## 40411              time anticipation
## 40412           lacking     negative
## 40413           lacking     negative
## 40414              lack     negative
## 40415       intelligent     positive
## 40416       intelligent        trust
## 40417     understanding     positive
## 40418     understanding        trust
## 40419            denial     negative
## 40420            change         fear
## 40421        scientific     positive
## 40422        scientific        trust
## 40423            reject        anger
## 40424            reject         fear
## 40425            reject     negative
## 40426            reject      sadness
## 40427          religion        trust
## 40428             death        anger
## 40429             death anticipation
## 40430             death      disgust
## 40431             death         fear
## 40432             death     negative
## 40433             death      sadness
## 40434             death     surprise
## 40435            change         fear
## 40436               god anticipation
## 40437               god         fear
## 40438               god          joy
## 40439               god     positive
## 40440               god        trust
## 40441               god anticipation
## 40442               god         fear
## 40443               god          joy
## 40444               god     positive
## 40445               god        trust
## 40446              land     positive
## 40447               god anticipation
## 40448               god         fear
## 40449               god          joy
## 40450               god     positive
## 40451               god        trust
## 40452              cool     positive
## 40453            ground        trust
## 40454              ruin         fear
## 40455              ruin     negative
## 40456              ruin      sadness
## 40457            change         fear
## 40458               god anticipation
## 40459               god         fear
## 40460               god          joy
## 40461               god     positive
## 40462               god        trust
## 40463        resistance        anger
## 40464        resistance     negative
## 40465              real     positive
## 40466              real        trust
## 40467           suspect         fear
## 40468           suspect     negative
## 40469          religion        trust
## 40470             death        anger
## 40471             death anticipation
## 40472             death      disgust
## 40473             death         fear
## 40474             death     negative
## 40475             death      sadness
## 40476             death     surprise
## 40477        ultimately anticipation
## 40478        ultimately     positive
## 40479            change         fear
## 40480             worry anticipation
## 40481             worry         fear
## 40482             worry     negative
## 40483             worry      sadness
## 40484              hate        anger
## 40485              hate      disgust
## 40486              hate         fear
## 40487              hate     negative
## 40488              hate      sadness
## 40489              evil        anger
## 40490              evil      disgust
## 40491              evil         fear
## 40492              evil     negative
## 40493              evil      sadness
## 40494            league     positive
## 40495              liar      disgust
## 40496              liar     negative
## 40497            loving          joy
## 40498            loving     positive
## 40499            loving        trust
## 40500           knowing     positive
## 40501          powerful        anger
## 40502          powerful anticipation
## 40503          powerful      disgust
## 40504          powerful         fear
## 40505          powerful          joy
## 40506          powerful     positive
## 40507          powerful        trust
## 40508               god anticipation
## 40509               god         fear
## 40510               god          joy
## 40511               god     positive
## 40512               god        trust
## 40513               don     positive
## 40514               don        trust
## 40515            forget     negative
## 40516            coming anticipation
## 40517           rapture anticipation
## 40518           rapture          joy
## 40519           rapture     positive
## 40520              kill         fear
## 40521              kill     negative
## 40522              kill      sadness
## 40523           mistake     negative
## 40524           mistake      sadness
## 40525          nonsense     negative
## 40526        ultimately anticipation
## 40527        ultimately     positive
## 40528           liberal     negative
## 40529           liberal     positive
## 40530           liberal     negative
## 40531           liberal     positive
## 40532             death        anger
## 40533             death anticipation
## 40534             death      disgust
## 40535             death         fear
## 40536             death     negative
## 40537             death      sadness
## 40538             death     surprise
## 40539              cult         fear
## 40540              cult     negative
## 40541            bother     negative
## 40542          question     positive
## 40543              real     positive
## 40544              real        trust
## 40545       blasphemous        anger
## 40546       blasphemous      disgust
## 40547       blasphemous     negative
## 40548               sin        anger
## 40549               sin      disgust
## 40550               sin         fear
## 40551               sin     negative
## 40552               sin      sadness
## 40553             shell        anger
## 40554             shell         fear
## 40555             shell     negative
## 40556             shell      sadness
## 40557             shell     surprise
## 40558        manipulate     negative
## 40559               bad        anger
## 40560               bad      disgust
## 40561               bad         fear
## 40562               bad     negative
## 40563               bad      sadness
## 40564            resist     negative
## 40565          suitable     positive
## 40566             watch anticipation
## 40567             watch         fear
## 40568               war         fear
## 40569               war     negative
## 40570              fair     positive
## 40571             haven     positive
## 40572             haven        trust
## 40573             haven     positive
## 40574             haven        trust
## 40575     disheartening     negative
## 40576     disheartening      sadness
## 40577             enemy        anger
## 40578             enemy      disgust
## 40579             enemy         fear
## 40580             enemy     negative
## 40581               god anticipation
## 40582               god         fear
## 40583               god          joy
## 40584               god     positive
## 40585               god        trust
## 40586           explain     positive
## 40587           explain        trust
## 40588            change         fear
## 40589            denial     negative
## 40590            change         fear
## 40591        acceptance     positive
## 40592            change         fear
## 40593              real     positive
## 40594              real        trust
## 40595               god anticipation
## 40596               god         fear
## 40597               god          joy
## 40598               god     positive
## 40599               god        trust
## 40600               god anticipation
## 40601               god         fear
## 40602               god          joy
## 40603               god     positive
## 40604               god        trust
## 40605           perfect anticipation
## 40606           perfect          joy
## 40607           perfect     positive
## 40608           perfect        trust
## 40609               don     positive
## 40610               don        trust
## 40611            change         fear
## 40612               god anticipation
## 40613               god         fear
## 40614               god          joy
## 40615               god     positive
## 40616               god        trust
## 40617              hope anticipation
## 40618              hope          joy
## 40619              hope     positive
## 40620              hope     surprise
## 40621              hope        trust
## 40622        supporting     positive
## 40623        supporting        trust
## 40624          question     positive
## 40625              deny        anger
## 40626              deny     negative
## 40627            change         fear
## 40628              hate        anger
## 40629              hate      disgust
## 40630              hate         fear
## 40631              hate     negative
## 40632              hate      sadness
## 40633            change         fear
## 40634         evolution     positive
## 40635           denying anticipation
## 40636           denying     negative
## 40637            crisis     negative
## 40638          suicidal        anger
## 40639          suicidal      disgust
## 40640          suicidal         fear
## 40641          suicidal     negative
## 40642          suicidal      sadness
## 40643              cult         fear
## 40644              cult     negative
## 40645             death        anger
## 40646             death anticipation
## 40647             death      disgust
## 40648             death         fear
## 40649             death     negative
## 40650             death      sadness
## 40651             death     surprise
## 40652              cult         fear
## 40653              cult     negative
## 40654          prophecy anticipation
## 40655              main     positive
## 40656              core     positive
## 40657            coming anticipation
## 40658            denial     negative
## 40659          prophecy anticipation
## 40660        perpetuate anticipation
## 40661       catastrophe        anger
## 40662       catastrophe      disgust
## 40663       catastrophe         fear
## 40664       catastrophe     negative
## 40665       catastrophe      sadness
## 40666       catastrophe     surprise
## 40667       progression anticipation
## 40668       progression          joy
## 40669       progression     positive
## 40670       progression      sadness
## 40671       progression        trust
## 40672          ultimate anticipation
## 40673          ultimate      sadness
## 40674              fall     negative
## 40675              fall      sadness
## 40676         destroyed        anger
## 40677         destroyed         fear
## 40678         destroyed     negative
## 40679         destroyed      sadness
## 40680             words        anger
## 40681             words     negative
## 40682          delusion        anger
## 40683          delusion         fear
## 40684          delusion     negative
## 40685          delusion      sadness
## 40686              main     positive
## 40687         ignorance     negative
## 40688          surround anticipation
## 40689          surround     negative
## 40690          surround     positive
## 40691              talk     positive
## 40692            taught        trust
## 40693        suspicious        anger
## 40694        suspicious anticipation
## 40695        suspicious     negative
## 40696         authority     positive
## 40697         authority        trust
## 40698            church anticipation
## 40699            church          joy
## 40700            church     positive
## 40701            church        trust
## 40702        government         fear
## 40703        government     negative
## 40704         skeptical     negative
## 40705          conflict        anger
## 40706          conflict         fear
## 40707          conflict     negative
## 40708          conflict      sadness
## 40709       fundamental     positive
## 40710       fundamental        trust
## 40711         evolution     positive
## 40712              plan anticipation
## 40713          disaster        anger
## 40714          disaster      disgust
## 40715          disaster         fear
## 40716          disaster     negative
## 40717          disaster      sadness
## 40718          disaster     surprise
## 40719         cleansing     positive
## 40720        punishment        anger
## 40721        punishment      disgust
## 40722        punishment         fear
## 40723        punishment     negative
## 40724         skeptical     negative
## 40725            change         fear
## 40726          powerful        anger
## 40727          powerful anticipation
## 40728          powerful      disgust
## 40729          powerful         fear
## 40730          powerful          joy
## 40731          powerful     positive
## 40732          powerful        trust
## 40733        convenient     positive
## 40734     justification     positive
## 40735         resources          joy
## 40736         resources     positive
## 40737         resources        trust
## 40738            change         fear
## 40739          powerful        anger
## 40740          powerful anticipation
## 40741          powerful      disgust
## 40742          powerful         fear
## 40743          powerful          joy
## 40744          powerful     positive
## 40745          powerful        trust
## 40746     justification     positive
## 40747           liberal     negative
## 40748           liberal     positive
## 40749            policy        trust
## 40750           perfect anticipation
## 40751           perfect          joy
## 40752           perfect     positive
## 40753           perfect        trust
## 40754           dynamic     surprise
## 40755              real     positive
## 40756              real        trust
## 40757             green          joy
## 40758             green     positive
## 40759             green        trust
## 40760              deal anticipation
## 40761              deal          joy
## 40762              deal     positive
## 40763              deal     surprise
## 40764              deal        trust
## 40765           include     positive
## 40766           justice     positive
## 40767           justice        trust
## 40768       progressive     positive
## 40769            change         fear
## 40770            change         fear
## 40771            change         fear
## 40772            threat        anger
## 40773            threat         fear
## 40774            threat     negative
## 40775           success anticipation
## 40776           success          joy
## 40777           success     positive
## 40778            policy        trust
## 40779            policy        trust
## 40780            threat        anger
## 40781            threat         fear
## 40782            threat     negative
## 40783               god anticipation
## 40784               god         fear
## 40785               god          joy
## 40786               god     positive
## 40787               god        trust
## 40788               god anticipation
## 40789               god         fear
## 40790               god          joy
## 40791               god     positive
## 40792               god        trust
## 40793             wrong     negative
## 40794         incorrect     negative
## 40795            change         fear
## 40796          religion        trust
## 40797          religion        trust
## 40798            attack        anger
## 40799            attack         fear
## 40800            attack     negative
## 40801         dangerous         fear
## 40802         dangerous     negative
## 40803          forgiven     positive
## 40804            damage        anger
## 40805            damage      disgust
## 40806            damage     negative
## 40807            damage      sadness
## 40808               god anticipation
## 40809               god         fear
## 40810               god          joy
## 40811               god     positive
## 40812               god        trust
## 40813          politics        anger
## 40814               sky     positive
## 40815               sky     positive
## 40816              pope     positive
## 40817            change         fear
## 40818            change         fear
## 40819              rest     positive
## 40820            change         fear
## 40821            public anticipation
## 40822            public     positive
## 40823           subject     negative
## 40824       susceptible     negative
## 40825        propaganda     negative
## 40826        propaganda     negative
## 40827            church anticipation
## 40828            church          joy
## 40829            church     positive
## 40830            church        trust
## 40831            change         fear
## 40832             money        anger
## 40833             money anticipation
## 40834             money          joy
## 40835             money     positive
## 40836             money     surprise
## 40837             money        trust
## 40838        propaganda     negative
## 40839            effort     positive
## 40840          powerful        anger
## 40841          powerful anticipation
## 40842          powerful      disgust
## 40843          powerful         fear
## 40844          powerful          joy
## 40845          powerful     positive
## 40846          powerful        trust
## 40847               god anticipation
## 40848               god         fear
## 40849               god          joy
## 40850               god     positive
## 40851               god        trust
## 40852               god anticipation
## 40853               god         fear
## 40854               god          joy
## 40855               god     positive
## 40856               god        trust
## 40857             prove     positive
## 40858               god anticipation
## 40859               god         fear
## 40860               god          joy
## 40861               god     positive
## 40862               god        trust
## 40863               ass     negative
## 40864            reason     positive
## 40865           abandon         fear
## 40866           abandon     negative
## 40867           abandon      sadness
## 40868               god anticipation
## 40869               god         fear
## 40870               god          joy
## 40871               god     positive
## 40872               god        trust
## 40873               god anticipation
## 40874               god         fear
## 40875               god          joy
## 40876               god     positive
## 40877               god        trust
## 40878        inaccurate     negative
## 40879            change         fear
## 40880          accurate     positive
## 40881          accurate        trust
## 40882            change         fear
## 40883         stupidity     negative
## 40884             faith anticipation
## 40885             faith          joy
## 40886             faith     positive
## 40887             faith        trust
## 40888               god anticipation
## 40889               god         fear
## 40890               god          joy
## 40891               god     positive
## 40892               god        trust
## 40893        ultimately anticipation
## 40894        ultimately     positive
## 40895      collectively     positive
## 40896      collectively        trust
## 40897              hate        anger
## 40898              hate      disgust
## 40899              hate         fear
## 40900              hate     negative
## 40901              hate      sadness
## 40902             start anticipation
## 40903            taught        trust
## 40904          distrust        anger
## 40905          distrust      disgust
## 40906          distrust         fear
## 40907          distrust     negative
## 40908         evolution     positive
## 40909              hell        anger
## 40910              hell      disgust
## 40911              hell         fear
## 40912              hell     negative
## 40913              hell      sadness
## 40914            damned     negative
## 40915               sky     positive
## 40916               mud     negative
## 40917           idiotic        anger
## 40918           idiotic      disgust
## 40919           idiotic     negative
## 40920            change         fear
## 40921              real     positive
## 40922              real        trust
## 40923         knowledge     positive
## 40924             ready anticipation
## 40925         organized     positive
## 40926          religion        trust
## 40927             death        anger
## 40928             death anticipation
## 40929             death      disgust
## 40930             death         fear
## 40931             death     negative
## 40932             death      sadness
## 40933             death     surprise
## 40934              cult         fear
## 40935              cult     negative
## 40936            change         fear
## 40937            refuse     negative
## 40938            change         fear
## 40939           perfect anticipation
## 40940           perfect          joy
## 40941           perfect     positive
## 40942           perfect        trust
## 40943               god anticipation
## 40944               god         fear
## 40945               god          joy
## 40946               god     positive
## 40947               god        trust
## 40948         concerned         fear
## 40949         concerned      sadness
## 40950            purely     positive
## 40951            purely        trust
## 40952              plan anticipation
## 40953        punishment        anger
## 40954        punishment      disgust
## 40955        punishment         fear
## 40956        punishment     negative
## 40957            wicked         fear
## 40958            wicked     negative
## 40959          distrust        anger
## 40960          distrust      disgust
## 40961          distrust         fear
## 40962          distrust     negative
## 40963            change         fear
## 40964             trust        trust
## 40965            change         fear
## 40966        acceptable     positive
## 40967         concerned         fear
## 40968         concerned      sadness
## 40969           rapture anticipation
## 40970           rapture          joy
## 40971           rapture     positive
## 40972            happen anticipation
## 40973              holy     positive
## 40974            expect anticipation
## 40975            expect     positive
## 40976            expect     surprise
## 40977            expect        trust
## 40978            happen anticipation
## 40979            change         fear
## 40980            unable     negative
## 40981            unable      sadness
## 40982        comprehend     positive
## 40983            change         fear
## 40984            change         fear
## 40985             adapt     positive
## 40986              time anticipation
## 40987              dumb     negative
## 40988           freedom          joy
## 40989           freedom     positive
## 40990           freedom        trust
## 40991            choice     positive
## 40992               god anticipation
## 40993               god         fear
## 40994               god          joy
## 40995               god     positive
## 40996               god        trust
## 40997          powerful        anger
## 40998          powerful anticipation
## 40999          powerful      disgust
## 41000          powerful         fear
## 41001          powerful          joy
## 41002          powerful     positive
## 41003          powerful        trust
## 41004         cognitive     positive
## 41005        dissonance        anger
## 41006        dissonance     negative
## 41007            stupid     negative
## 41008               god anticipation
## 41009               god         fear
## 41010               god          joy
## 41011               god     positive
## 41012               god        trust
## 41013            change         fear
## 41014               god anticipation
## 41015               god         fear
## 41016               god          joy
## 41017               god     positive
## 41018               god        trust
## 41019          preserve     positive
## 41020         evolution     positive
## 41021            change         fear
## 41022             lower     negative
## 41023             lower      sadness
## 41024            chance     surprise
## 41025         evolution     positive
## 41026         evolution     positive
## 41027             crazy        anger
## 41028             crazy         fear
## 41029             crazy     negative
## 41030             crazy      sadness
## 41031         evolution     positive
## 41032            result anticipation
## 41033         evolution     positive
## 41034       distinction     positive
## 41035         evolution     positive
## 41036      organization anticipation
## 41037      organization          joy
## 41038      organization     positive
## 41039      organization     surprise
## 41040      organization        trust
## 41041            church anticipation
## 41042            church          joy
## 41043            church     positive
## 41044            church        trust
## 41045            school        trust
## 41046            change         fear
## 41047       accountable     positive
## 41048       accountable        trust
## 41049       responsible     positive
## 41050       responsible        trust
## 41051    accountability     positive
## 41052    accountability        trust
## 41053             worse         fear
## 41054             worse     negative
## 41055             worse      sadness
## 41056          anathema        anger
## 41057          anathema      disgust
## 41058          anathema         fear
## 41059          anathema     negative
## 41060          anathema      sadness
## 41061               god anticipation
## 41062               god         fear
## 41063               god          joy
## 41064               god     positive
## 41065               god        trust
## 41066              heal          joy
## 41067              heal     positive
## 41068              heal        trust
## 41069         concerned         fear
## 41070         concerned      sadness
## 41071            change         fear
## 41072             worry anticipation
## 41073             worry         fear
## 41074             worry     negative
## 41075             worry      sadness
## 41076         believing     positive
## 41077         believing        trust
## 41078            change         fear
## 41079            change         fear
## 41080              luck anticipation
## 41081              luck          joy
## 41082              luck     positive
## 41083              luck     surprise
## 41084        convincing        trust
## 41085          fighting        anger
## 41086          fighting     negative
## 41087            change         fear
## 41088             money        anger
## 41089             money anticipation
## 41090             money          joy
## 41091             money     positive
## 41092             money     surprise
## 41093             money        trust
## 41094            resist     negative
## 41095             fight        anger
## 41096             fight         fear
## 41097             fight     negative
## 41098            change         fear
## 41099           comfort anticipation
## 41100           comfort          joy
## 41101           comfort     positive
## 41102           comfort        trust
## 41103         compliant     positive
## 41104           comfort anticipation
## 41105           comfort          joy
## 41106           comfort     positive
## 41107           comfort        trust
## 41108               don     positive
## 41109               don        trust
## 41110            change         fear
## 41111            secret        trust
## 41112           comfort anticipation
## 41113           comfort          joy
## 41114           comfort     positive
## 41115           comfort        trust
## 41116           limited        anger
## 41117           limited     negative
## 41118           limited      sadness
## 41119             tough     negative
## 41120             tough      sadness
## 41121          convince anticipation
## 41122          convince     positive
## 41123          convince        trust
## 41124           rapture anticipation
## 41125           rapture          joy
## 41126           rapture     positive
## 41127            change         fear
## 41128            change         fear
## 41129           extinct     negative
## 41130           extinct      sadness
## 41131        acceptable     positive
## 41132            change         fear
## 41133           usurped        anger
## 41134           usurped         fear
## 41135           usurped     negative
## 41136          religion        trust
## 41137        propaganda     negative
## 41138          intended anticipation
## 41139          intended     positive
## 41140              suck     negative
## 41141              fits        anger
## 41142              fits     negative
## 41143            change         fear
## 41144              real     positive
## 41145              real        trust
## 41146               god anticipation
## 41147               god         fear
## 41148               god          joy
## 41149               god     positive
## 41150               god        trust
## 41151              hate        anger
## 41152              hate      disgust
## 41153              hate         fear
## 41154              hate     negative
## 41155              hate      sadness
## 41156           success anticipation
## 41157           success          joy
## 41158           success     positive
## 41159           freedom          joy
## 41160           freedom     positive
## 41161           freedom        trust
## 41162             money        anger
## 41163             money anticipation
## 41164             money          joy
## 41165             money     positive
## 41166             money     surprise
## 41167             money        trust
## 41168             green          joy
## 41169             green     positive
## 41170             green        trust
## 41171             beast        anger
## 41172             beast         fear
## 41173             beast     negative
## 41174          commerce        trust
## 41175          friendly anticipation
## 41176          friendly          joy
## 41177          friendly     positive
## 41178          friendly        trust
## 41179          powerful        anger
## 41180          powerful anticipation
## 41181          powerful      disgust
## 41182          powerful         fear
## 41183          powerful          joy
## 41184          powerful     positive
## 41185          powerful        trust
## 41186       instruction     positive
## 41187       instruction        trust
## 41188            manual        trust
## 41189             level     positive
## 41190             level        trust
## 41191             faith anticipation
## 41192             faith          joy
## 41193             faith     positive
## 41194             faith        trust
## 41195               god anticipation
## 41196               god         fear
## 41197               god          joy
## 41198               god     positive
## 41199               god        trust
## 41200           protect     positive
## 41201              evil        anger
## 41202              evil      disgust
## 41203              evil         fear
## 41204              evil     negative
## 41205              evil      sadness
## 41206               god anticipation
## 41207               god         fear
## 41208               god          joy
## 41209               god     positive
## 41210               god        trust
## 41211           knowing     positive
## 41212            loving          joy
## 41213            loving     positive
## 41214            loving        trust
## 41215              plan anticipation
## 41216          personal        trust
## 41217             moral        anger
## 41218             moral     positive
## 41219             moral        trust
## 41220          standing     positive
## 41221             enemy        anger
## 41222             enemy      disgust
## 41223             enemy         fear
## 41224             enemy     negative
## 41225               don     positive
## 41226               don        trust
## 41227        suspicious        anger
## 41228        suspicious anticipation
## 41229        suspicious     negative
## 41230            stupid     negative
## 41231           rapture anticipation
## 41232           rapture          joy
## 41233           rapture     positive
## 41234          imminent anticipation
## 41235          imminent         fear
## 41236           protect     positive
## 41237              vote        anger
## 41238              vote anticipation
## 41239              vote          joy
## 41240              vote     negative
## 41241              vote     positive
## 41242              vote      sadness
## 41243              vote     surprise
## 41244              vote        trust
## 41245            change         fear
## 41246           falling     negative
## 41247           falling      sadness
## 41248              save          joy
## 41249              save     positive
## 41250              save        trust
## 41251             elect     positive
## 41252             elect        trust
## 41253          doomsday        anger
## 41254          doomsday anticipation
## 41255          doomsday      disgust
## 41256          doomsday         fear
## 41257          doomsday     negative
## 41258          doomsday      sadness
## 41259          calamity      sadness
## 41260             money        anger
## 41261             money anticipation
## 41262             money          joy
## 41263             money     positive
## 41264             money     surprise
## 41265             money        trust
## 41266        propaganda     negative
## 41267              fake     negative
## 41268            change         fear
## 41269              real     positive
## 41270              real        trust
## 41271             wrong     negative
## 41272              love          joy
## 41273              love     positive
## 41274             sweet anticipation
## 41275             sweet          joy
## 41276             sweet     positive
## 41277             sweet     surprise
## 41278             sweet        trust
## 41279               god anticipation
## 41280               god         fear
## 41281               god          joy
## 41282               god     positive
## 41283               god        trust
## 41284          learning     positive
## 41285            loving          joy
## 41286            loving     positive
## 41287            loving        trust
## 41288           worship anticipation
## 41289           worship         fear
## 41290           worship          joy
## 41291           worship     positive
## 41292           worship        trust
## 41293        witchcraft        anger
## 41294        witchcraft         fear
## 41295        witchcraft     negative
## 41296        witchcraft      sadness
## 41297       responsible     positive
## 41298       responsible        trust
## 41299             break     surprise
## 41300            damage        anger
## 41301            damage      disgust
## 41302            damage     negative
## 41303            damage      sadness
## 41304               don     positive
## 41305               don        trust
## 41306               pay anticipation
## 41307               pay          joy
## 41308               pay     positive
## 41309               pay        trust
## 41310            damage        anger
## 41311            damage      disgust
## 41312            damage     negative
## 41313            damage      sadness
## 41314            ignore     negative
## 41315            repent         fear
## 41316            repent     positive
## 41317               sin        anger
## 41318               sin      disgust
## 41319               sin         fear
## 41320               sin     negative
## 41321               sin      sadness
## 41322       immortality anticipation
## 41323               sin        anger
## 41324               sin      disgust
## 41325               sin         fear
## 41326               sin     negative
## 41327               sin      sadness
## 41328              cool     positive
## 41329           forgive     positive
## 41330              love          joy
## 41331              love     positive
## 41332            change         fear
## 41333          continue anticipation
## 41334          continue     positive
## 41335          continue        trust
## 41336        accelerate anticipation
## 41337            reason     positive
## 41338               mad        anger
## 41339               mad      disgust
## 41340               mad         fear
## 41341               mad     negative
## 41342               mad      sadness
## 41343               don     positive
## 41344               don        trust
## 41345            forget     negative
## 41346        government         fear
## 41347        government     negative
## 41348               bad        anger
## 41349               bad      disgust
## 41350               bad         fear
## 41351               bad     negative
## 41352               bad      sadness
## 41353              time anticipation
## 41354           rapture anticipation
## 41355           rapture          joy
## 41356           rapture     positive
## 41357               don     positive
## 41358               don        trust
## 41359           fulfill          joy
## 41360           fulfill     positive
## 41361             money        anger
## 41362             money anticipation
## 41363             money          joy
## 41364             money     positive
## 41365             money     surprise
## 41366             money        trust
## 41367             start anticipation
## 41368          religion        trust
## 41369               don     positive
## 41370               don        trust
## 41371           rapture anticipation
## 41372           rapture          joy
## 41373           rapture     positive
## 41374               god anticipation
## 41375               god         fear
## 41376               god          joy
## 41377               god     positive
## 41378               god        trust
## 41379               god anticipation
## 41380               god         fear
## 41381               god          joy
## 41382               god     positive
## 41383               god        trust
## 41384             flood         fear
## 41385               god anticipation
## 41386               god         fear
## 41387               god          joy
## 41388               god     positive
## 41389               god        trust
## 41390           useless     negative
## 41391       destruction        anger
## 41392       destruction     negative
## 41393         resources          joy
## 41394         resources     positive
## 41395         resources        trust
## 41396              time anticipation
## 41397            effort     positive
## 41398            coming anticipation
## 41399             worry anticipation
## 41400             worry         fear
## 41401             worry     negative
## 41402             worry      sadness
## 41403               don     positive
## 41404               don        trust
## 41405               god anticipation
## 41406               god         fear
## 41407               god          joy
## 41408               god     positive
## 41409               god        trust
## 41410         believing     positive
## 41411         believing        trust
## 41412            change         fear
## 41413         believing     positive
## 41414         believing        trust
## 41415            wizard anticipation
## 41416            wizard     positive
## 41417            wizard     surprise
## 41418              love          joy
## 41419              love     positive
## 41420            change         fear
## 41421               bad        anger
## 41422               bad      disgust
## 41423               bad         fear
## 41424               bad     negative
## 41425               bad      sadness
## 41426          theology anticipation
## 41427           godless        anger
## 41428           godless     negative
## 41429            change         fear
## 41430              love          joy
## 41431              love     positive
## 41432              hate        anger
## 41433              hate      disgust
## 41434              hate         fear
## 41435              hate     negative
## 41436              hate      sadness
## 41437         dangerous         fear
## 41438         dangerous     negative
## 41439              sick      disgust
## 41440              sick     negative
## 41441              sick      sadness
## 41442        excitement anticipation
## 41443        excitement          joy
## 41444        excitement     positive
## 41445        excitement     surprise
## 41446         impending anticipation
## 41447         impending         fear
## 41448           rapture anticipation
## 41449           rapture          joy
## 41450           rapture     positive
## 41451          ultimate anticipation
## 41452          ultimate      sadness
## 41453         dangerous         fear
## 41454         dangerous     negative
## 41455              love          joy
## 41456              love     positive
## 41457            change         fear
## 41458            oppose     negative
## 41459         destroyed        anger
## 41460         destroyed         fear
## 41461         destroyed     negative
## 41462         destroyed      sadness
## 41463              save          joy
## 41464              save     positive
## 41465              save        trust
## 41466             death        anger
## 41467             death anticipation
## 41468             death      disgust
## 41469             death         fear
## 41470             death     negative
## 41471             death      sadness
## 41472             death     surprise
## 41473              cult         fear
## 41474              cult     negative
## 41475           rapture anticipation
## 41476           rapture          joy
## 41477           rapture     positive
## 41478          worrying anticipation
## 41479          worrying         fear
## 41480          worrying     negative
## 41481          worrying      sadness
## 41482            action     positive
## 41483         coalition     positive
## 41484             trust        trust
## 41485            deceit        anger
## 41486            deceit      disgust
## 41487            deceit         fear
## 41488            deceit     negative
## 41489            deceit      sadness
## 41490            deceit     surprise
## 41491        government         fear
## 41492        government     negative
## 41493             trust        trust
## 41494            church anticipation
## 41495            church          joy
## 41496            church     positive
## 41497            church        trust
## 41498         difficult         fear
## 41499              baby          joy
## 41500              baby     positive
## 41501           rapture anticipation
## 41502           rapture          joy
## 41503           rapture     positive
## 41504              wait anticipation
## 41505              wait     negative
## 41506            larger      disgust
## 41507            larger     surprise
## 41508            larger        trust
## 41509            refuse     negative
## 41510               god anticipation
## 41511               god         fear
## 41512               god          joy
## 41513               god     positive
## 41514               god        trust
## 41515            denial     negative
## 41516            system        trust
## 41517            change         fear
## 41518             vague     negative
## 41519            change         fear
## 41520          religion        trust
## 41521          annoying        anger
## 41522          annoying     negative
## 41523             death        anger
## 41524             death anticipation
## 41525             death      disgust
## 41526             death         fear
## 41527             death     negative
## 41528             death      sadness
## 41529             death     surprise
## 41530              cult         fear
## 41531              cult     negative
## 41532        excitement anticipation
## 41533        excitement          joy
## 41534        excitement     positive
## 41535        excitement     surprise
## 41536           rapture anticipation
## 41537           rapture          joy
## 41538           rapture     positive
## 41539            happen anticipation
## 41540             dying        anger
## 41541             dying      disgust
## 41542             dying         fear
## 41543             dying     negative
## 41544             dying      sadness
## 41545           rapture anticipation
## 41546           rapture          joy
## 41547           rapture     positive
## 41548               bad        anger
## 41549               bad      disgust
## 41550               bad         fear
## 41551               bad     negative
## 41552               bad      sadness
## 41553            reason     positive
## 41554             whack     negative
## 41555          fighting        anger
## 41556          fighting     negative
## 41557         ownership     positive
## 41558              holy     positive
## 41559              land     positive
## 41560           rapture anticipation
## 41561           rapture          joy
## 41562           rapture     positive
## 41563            happen anticipation
## 41564          majority          joy
## 41565          majority     positive
## 41566          majority        trust
## 41567        population     positive
## 41568         testament anticipation
## 41569         testament        trust
## 41570             death        anger
## 41571             death anticipation
## 41572             death      disgust
## 41573             death         fear
## 41574             death     negative
## 41575             death      sadness
## 41576             death     surprise
## 41577              cult         fear
## 41578              cult     negative
## 41579            change         fear
## 41580               god anticipation
## 41581               god         fear
## 41582               god          joy
## 41583               god     positive
## 41584               god        trust
## 41585           perfect anticipation
## 41586           perfect          joy
## 41587           perfect     positive
## 41588           perfect        trust
## 41589            forget     negative
## 41590           magical anticipation
## 41591           magical          joy
## 41592           magical     positive
## 41593           magical     surprise
## 41594               sky     positive
## 41595            taught        trust
## 41596           respect anticipation
## 41597           respect          joy
## 41598           respect     positive
## 41599           respect        trust
## 41600           charity          joy
## 41601           charity     positive
## 41602             serve     negative
## 41603             serve        trust
## 41604         organized     positive
## 41605          religion        trust
## 41606     justification     positive
## 41607             faith anticipation
## 41608             faith          joy
## 41609             faith     positive
## 41610             faith        trust
## 41611             happy anticipation
## 41612             happy          joy
## 41613             happy     positive
## 41614             happy        trust
## 41615           healthy     positive
## 41616         challenge        anger
## 41617         challenge         fear
## 41618         challenge     negative
## 41619            chosen     positive
## 41620         protected        trust
## 41621             faith anticipation
## 41622             faith          joy
## 41623             faith     positive
## 41624             faith        trust
## 41625            unfold anticipation
## 41626            unfold     positive
## 41627              plan anticipation
## 41628             happy anticipation
## 41629             happy          joy
## 41630             happy     positive
## 41631             happy        trust
## 41632              cult         fear
## 41633              cult     negative
## 41634        infallible     positive
## 41635          monetary anticipation
## 41636          monetary     positive
## 41637            change         fear
## 41638              fall     negative
## 41639              fall      sadness
## 41640            change         fear
## 41641              ruin         fear
## 41642              ruin     negative
## 41643              ruin      sadness
## 41644               god anticipation
## 41645               god         fear
## 41646               god          joy
## 41647               god     positive
## 41648               god        trust
## 41649               god anticipation
## 41650               god         fear
## 41651               god          joy
## 41652               god     positive
## 41653               god        trust
## 41654             clean          joy
## 41655             clean     positive
## 41656             clean        trust
## 41657          judgment     surprise
## 41658           provide     positive
## 41659           provide        trust
## 41660            create          joy
## 41661            create     positive
## 41662         resources          joy
## 41663         resources     positive
## 41664         resources        trust
## 41665              time anticipation
## 41666             leave     negative
## 41667             leave      sadness
## 41668             leave     surprise
## 41669            church anticipation
## 41670            church          joy
## 41671            church     positive
## 41672            church        trust
## 41673          prophecy anticipation
## 41674            reason     positive
## 41675              vote        anger
## 41676              vote anticipation
## 41677              vote          joy
## 41678              vote     negative
## 41679              vote     positive
## 41680              vote      sadness
## 41681              vote     surprise
## 41682              vote        trust
## 41683            serial anticipation
## 41684              liar      disgust
## 41685              liar     negative
## 41686             elect     positive
## 41687             elect        trust
## 41688             beast        anger
## 41689             beast         fear
## 41690             beast     negative
## 41691            reason     positive
## 41692            change         fear
## 41693         cooperate     positive
## 41694            debate     positive
## 41695             beast        anger
## 41696             beast         fear
## 41697             beast     negative
## 41698           deceive        anger
## 41699           deceive      disgust
## 41700           deceive     negative
## 41701           deceive      sadness
## 41702            forced         fear
## 41703            forced     negative
## 41704           worship anticipation
## 41705           worship         fear
## 41706           worship          joy
## 41707           worship     positive
## 41708           worship        trust
## 41709             beast        anger
## 41710             beast         fear
## 41711             beast     negative
## 41712               die         fear
## 41713               die     negative
## 41714               die      sadness
## 41715               god anticipation
## 41716               god         fear
## 41717               god          joy
## 41718               god     positive
## 41719               god        trust
## 41720          continue anticipation
## 41721          continue     positive
## 41722          continue        trust
## 41723            change         fear
## 41724           denying anticipation
## 41725           denying     negative
## 41726              word     positive
## 41727              word        trust
## 41728               god anticipation
## 41729               god         fear
## 41730               god          joy
## 41731               god     positive
## 41732               god        trust
## 41733       hostilities        anger
## 41734       hostilities         fear
## 41735       hostilities     negative
## 41736           special          joy
## 41737           special     positive
## 41738            forced         fear
## 41739            forced     negative
## 41740      disagreement        anger
## 41741      disagreement     negative
## 41742      disagreement      sadness
## 41743            change         fear
## 41744          abortion      disgust
## 41745          abortion         fear
## 41746          abortion     negative
## 41747          abortion      sadness
## 41748              pope     positive
## 41749           content          joy
## 41750           content     positive
## 41751           content        trust
## 41752            reason     positive
## 41753           traitor        anger
## 41754           traitor      disgust
## 41755           traitor         fear
## 41756           traitor     negative
## 41757           traitor      sadness
## 41758             trump     surprise
## 41759        delusional        anger
## 41760        delusional         fear
## 41761        delusional     negative
## 41762           ancient     negative
## 41763               god anticipation
## 41764               god         fear
## 41765               god          joy
## 41766               god     positive
## 41767               god        trust
## 41768             greed        anger
## 41769             greed      disgust
## 41770             greed     negative
## 41771        irrelevant     negative
## 41772            greedy      disgust
## 41773            greedy     negative
## 41774              gain anticipation
## 41775              gain          joy
## 41776              gain     positive
## 41777         illogical     negative
## 41778             extra     positive
## 41779               die         fear
## 41780               die     negative
## 41781               die      sadness
## 41782               god anticipation
## 41783               god         fear
## 41784               god          joy
## 41785               god     positive
## 41786               god        trust
## 41787               god anticipation
## 41788               god         fear
## 41789               god          joy
## 41790               god     positive
## 41791               god        trust
## 41792               god anticipation
## 41793               god         fear
## 41794               god          joy
## 41795               god     positive
## 41796               god        trust
## 41797               god anticipation
## 41798               god         fear
## 41799               god          joy
## 41800               god     positive
## 41801               god        trust
## 41802          contrary     negative
## 41803           affront        anger
## 41804           affront      disgust
## 41805           affront         fear
## 41806           affront     negative
## 41807           affront      sadness
## 41808           affront     surprise
## 41809               god anticipation
## 41810               god         fear
## 41811               god          joy
## 41812               god     positive
## 41813               god        trust
## 41814               god anticipation
## 41815               god         fear
## 41816               god          joy
## 41817               god     positive
## 41818               god        trust
## 41819           footing        trust
## 41820        importance anticipation
## 41821        importance     positive
## 41822          religion        trust
## 41823       complicated     negative
## 41824             tribe        trust
## 41825             tough     negative
## 41826             tough      sadness
## 41827          religion        trust
## 41828          unbiased     positive
## 41829          abortion      disgust
## 41830          abortion         fear
## 41831          abortion     negative
## 41832          abortion      sadness
## 41833               sex anticipation
## 41834               sex          joy
## 41835               sex     positive
## 41836               sex        trust
## 41837               sex anticipation
## 41838               sex          joy
## 41839               sex     positive
## 41840               sex        trust
## 41841            church anticipation
## 41842            church          joy
## 41843            church     positive
## 41844            church        trust
## 41845        accidental         fear
## 41846        accidental     negative
## 41847        accidental     surprise
## 41848         desperate     negative
## 41849       competition anticipation
## 41850       competition     negative
## 41851             labor anticipation
## 41852             labor          joy
## 41853             labor     positive
## 41854             labor     surprise
## 41855             labor        trust
## 41856             trump     surprise
## 41857         existence     positive
## 41858              loss        anger
## 41859              loss         fear
## 41860              loss     negative
## 41861              loss      sadness
## 41862             wrong     negative
## 41863           subject     negative
## 41864             wrong     negative
## 41865     reinforcement     positive
## 41866     reinforcement        trust
## 41867            rooted     positive
## 41868            rooted        trust
## 41869            choice     positive
## 41870             worth     positive
## 41871             happy anticipation
## 41872             happy          joy
## 41873             happy     positive
## 41874             happy        trust
## 41875         suffering      disgust
## 41876         suffering         fear
## 41877         suffering     negative
## 41878         suffering      sadness
## 41879              deal anticipation
## 41880              deal          joy
## 41881              deal     positive
## 41882              deal     surprise
## 41883              deal        trust
## 41884               god anticipation
## 41885               god         fear
## 41886               god          joy
## 41887               god     positive
## 41888               god        trust
## 41889              holy     positive
## 41890            excuse     negative
## 41891         concerned         fear
## 41892         concerned      sadness
## 41893     understanding     positive
## 41894     understanding        trust
## 41895            purely     positive
## 41896            purely        trust
## 41897            ignore     negative
## 41898            change         fear
## 41899           mistake     negative
## 41900           mistake      sadness
## 41901          misplace        anger
## 41902          misplace      disgust
## 41903          misplace     negative
## 41904           anguish        anger
## 41905           anguish         fear
## 41906           anguish     negative
## 41907           anguish      sadness
## 41908          solution     positive
## 41909          electric          joy
## 41910          electric     positive
## 41911          electric     surprise
## 41912             upset        anger
## 41913             upset     negative
## 41914             upset      sadness
## 41915              prey         fear
## 41916              prey     negative
## 41917        government         fear
## 41918        government     negative
## 41919              food          joy
## 41920              food     positive
## 41921              food        trust
## 41922          solution     positive
## 41923              kill         fear
## 41924              kill     negative
## 41925              kill      sadness
## 41926   unintentionally     negative
## 41927   unintentionally     surprise
## 41928            crisis     negative
## 41929              food          joy
## 41930              food     positive
## 41931              food        trust
## 41932          solution     positive
## 41933            change         fear
## 41934            crisis     negative
## 41935            change         fear
## 41936              hoax        anger
## 41937              hoax      disgust
## 41938              hoax     negative
## 41939              hoax      sadness
## 41940              hoax     surprise
## 41941              cold     negative
## 41942           related        trust
## 41943          religion        trust
## 41944            allied     positive
## 41945            allied        trust
## 41946              deny        anger
## 41947              deny     negative
## 41948            change         fear
## 41949             found          joy
## 41950             found     positive
## 41951             found        trust
## 41952           primary     positive
## 41953         believing     positive
## 41954         believing        trust
## 41955            change         fear
## 41956          strongly     positive
## 41957            change         fear
## 41958              hate        anger
## 41959              hate      disgust
## 41960              hate         fear
## 41961              hate     negative
## 41962              hate      sadness
## 41963              love          joy
## 41964              love     positive
## 41965        acceptance     positive
## 41966         shattered     negative
## 41967         shattered      sadness
## 41968              hate        anger
## 41969              hate      disgust
## 41970              hate         fear
## 41971              hate     negative
## 41972              hate      sadness
## 41973             truth     positive
## 41974             truth        trust
## 41975              pray anticipation
## 41976              pray         fear
## 41977              pray          joy
## 41978              pray     positive
## 41979              pray     surprise
## 41980              pray        trust
## 41981          religion        trust
## 41982           rapture anticipation
## 41983           rapture          joy
## 41984           rapture     positive
## 41985             wrath        anger
## 41986             wrath         fear
## 41987             wrath     negative
## 41988        corruption      disgust
## 41989        corruption     negative
## 41990             words        anger
## 41991             words     negative
## 41992         disregard     negative
## 41993              bank        trust
## 41994               sky     positive
## 41995               god anticipation
## 41996               god         fear
## 41997               god          joy
## 41998               god     positive
## 41999               god        trust
## 42000          dominion         fear
## 42001          dominion        trust
## 42002               sea     positive
## 42003          creeping anticipation
## 42004               don     positive
## 42005               don        trust
## 42006          dominion         fear
## 42007          dominion        trust
## 42008         resources          joy
## 42009         resources     positive
## 42010         resources        trust
## 42011            coming anticipation
## 42012              real     positive
## 42013              real        trust
## 42014           culprit     negative
## 42015          surprise         fear
## 42016          surprise          joy
## 42017          surprise     positive
## 42018          surprise     surprise
## 42019           logical     positive
## 42020               god anticipation
## 42021               god         fear
## 42022               god          joy
## 42023               god     positive
## 42024               god        trust
## 42025           perfect anticipation
## 42026           perfect          joy
## 42027           perfect     positive
## 42028           perfect        trust
## 42029              harm         fear
## 42030              harm     negative
## 42031               god anticipation
## 42032               god         fear
## 42033               god          joy
## 42034               god     positive
## 42035               god        trust
## 42036            change         fear
## 42037            untrue     negative
## 42038            change         fear
## 42039              real     positive
## 42040              real        trust
## 42041           special          joy
## 42042           special     positive
## 42043       inseparable          joy
## 42044       inseparable     positive
## 42045       inseparable        trust
## 42046          religion        trust
## 42047              cult         fear
## 42048              cult     negative
## 42049            change         fear
## 42050              real     positive
## 42051              real        trust
## 42052           culprit     negative
## 42053               god anticipation
## 42054               god         fear
## 42055               god          joy
## 42056               god     positive
## 42057               god        trust
## 42058          powerful        anger
## 42059          powerful anticipation
## 42060          powerful      disgust
## 42061          powerful         fear
## 42062          powerful          joy
## 42063          powerful     positive
## 42064          powerful        trust
## 42065               god anticipation
## 42066               god         fear
## 42067               god          joy
## 42068               god     positive
## 42069               god        trust
## 42070               god anticipation
## 42071               god         fear
## 42072               god          joy
## 42073               god     positive
## 42074               god        trust
## 42075             wrong     negative
## 42076               god anticipation
## 42077               god         fear
## 42078               god          joy
## 42079               god     positive
## 42080               god        trust
## 42081            system        trust
## 42082              evil        anger
## 42083              evil      disgust
## 42084              evil         fear
## 42085              evil     negative
## 42086              evil      sadness
## 42087               god anticipation
## 42088               god         fear
## 42089               god          joy
## 42090               god     positive
## 42091               god        trust
## 42092         destroyed        anger
## 42093         destroyed         fear
## 42094         destroyed     negative
## 42095         destroyed      sadness
## 42096             flood         fear
## 42097          creature      disgust
## 42098          creature         fear
## 42099          creature     negative
## 42100              save          joy
## 42101              save     positive
## 42102              save        trust
## 42103           digress anticipation
## 42104           digress     negative
## 42105            change         fear
## 42106               god anticipation
## 42107               god         fear
## 42108               god          joy
## 42109               god     positive
## 42110               god        trust
## 42111              fear        anger
## 42112              fear         fear
## 42113              fear     negative
## 42114               god anticipation
## 42115               god         fear
## 42116               god          joy
## 42117               god     positive
## 42118               god        trust
## 42119         ludicrous     negative
## 42120            change         fear
## 42121           affront        anger
## 42122           affront      disgust
## 42123           affront         fear
## 42124           affront     negative
## 42125           affront      sadness
## 42126           affront     surprise
## 42127              deny        anger
## 42128              deny     negative
## 42129            change         fear
## 42130         encourage          joy
## 42131         encourage     positive
## 42132         encourage        trust
## 42133               bad        anger
## 42134               bad      disgust
## 42135               bad         fear
## 42136               bad     negative
## 42137               bad      sadness
## 42138            coming anticipation
## 42139         suffering      disgust
## 42140         suffering         fear
## 42141         suffering     negative
## 42142         suffering      sadness
## 42143        punishment        anger
## 42144        punishment      disgust
## 42145        punishment         fear
## 42146        punishment     negative
## 42147              fall     negative
## 42148              fall      sadness
## 42149               pay anticipation
## 42150               pay          joy
## 42151               pay     positive
## 42152               pay        trust
## 42153            giving     positive
## 42154            change         fear
## 42155              fake     negative
## 42156          majority          joy
## 42157          majority     positive
## 42158          majority        trust
## 42159               god anticipation
## 42160               god         fear
## 42161               god          joy
## 42162               god     positive
## 42163               god        trust
## 42164            cancer        anger
## 42165            cancer      disgust
## 42166            cancer         fear
## 42167            cancer     negative
## 42168            cancer      sadness
## 42169               god anticipation
## 42170               god         fear
## 42171               god          joy
## 42172               god     positive
## 42173               god        trust
## 42174               god anticipation
## 42175               god         fear
## 42176               god          joy
## 42177               god     positive
## 42178               god        trust
## 42179            cancer        anger
## 42180            cancer      disgust
## 42181            cancer         fear
## 42182            cancer     negative
## 42183            cancer      sadness
## 42184              pray anticipation
## 42185              pray         fear
## 42186              pray          joy
## 42187              pray     positive
## 42188              pray     surprise
## 42189              pray        trust
## 42190               god anticipation
## 42191               god         fear
## 42192               god          joy
## 42193               god     positive
## 42194               god        trust
## 42195            insult        anger
## 42196            insult      disgust
## 42197            insult     negative
## 42198            insult      sadness
## 42199            insult     surprise
## 42200            reject        anger
## 42201            reject         fear
## 42202            reject     negative
## 42203            reject      sadness
## 42204              gift anticipation
## 42205              gift          joy
## 42206              gift     positive
## 42207              gift     surprise
## 42208             faith anticipation
## 42209             faith          joy
## 42210             faith     positive
## 42211             faith        trust
## 42212               god anticipation
## 42213               god         fear
## 42214               god          joy
## 42215               god     positive
## 42216               god        trust
## 42217            cancer        anger
## 42218            cancer      disgust
## 42219            cancer         fear
## 42220            cancer     negative
## 42221            cancer      sadness
## 42222            doctor     positive
## 42223            doctor        trust
## 42224            cancer        anger
## 42225            cancer      disgust
## 42226            cancer         fear
## 42227            cancer     negative
## 42228            cancer      sadness
## 42229            doctor     positive
## 42230            doctor        trust
## 42231            cancer        anger
## 42232            cancer      disgust
## 42233            cancer         fear
## 42234            cancer     negative
## 42235            cancer      sadness
## 42236               god anticipation
## 42237               god         fear
## 42238               god          joy
## 42239               god     positive
## 42240               god        trust
## 42241            cancer        anger
## 42242            cancer      disgust
## 42243            cancer         fear
## 42244            cancer     negative
## 42245            cancer      sadness
## 42246          conflict        anger
## 42247          conflict         fear
## 42248          conflict     negative
## 42249          conflict      sadness
## 42250            taught        trust
## 42251            reason     positive
## 42252            reject        anger
## 42253            reject         fear
## 42254            reject     negative
## 42255            reject      sadness
## 42256          learning     positive
## 42257            taught        trust
## 42258             tribe        trust
## 42259          religion        trust
## 42260              join     positive
## 42261          delusion        anger
## 42262          delusion         fear
## 42263          delusion     negative
## 42264          delusion      sadness
## 42265              trip     surprise
## 42266           ability     positive
## 42267         conducive     positive
## 42268           survive     positive
## 42269         including     positive
## 42270          delusion        anger
## 42271          delusion         fear
## 42272          delusion     negative
## 42273          delusion      sadness
## 42274              cult         fear
## 42275              cult     negative
## 42276             start anticipation
## 42277            taught        trust
## 42278              cult         fear
## 42279              cult     negative
## 42280        frightened         fear
## 42281        frightened     negative
## 42282        frightened     surprise
## 42283               god anticipation
## 42284               god         fear
## 42285               god          joy
## 42286               god     positive
## 42287               god        trust
## 42288          powerful        anger
## 42289          powerful anticipation
## 42290          powerful      disgust
## 42291          powerful         fear
## 42292          powerful          joy
## 42293          powerful     positive
## 42294          powerful        trust
## 42295              harm         fear
## 42296              harm     negative
## 42297          powerful        anger
## 42298          powerful anticipation
## 42299          powerful      disgust
## 42300          powerful         fear
## 42301          powerful          joy
## 42302          powerful     positive
## 42303          powerful        trust
## 42304               god anticipation
## 42305               god         fear
## 42306               god          joy
## 42307               god     positive
## 42308               god        trust
## 42309             guess     surprise
## 42310              pray anticipation
## 42311              pray         fear
## 42312              pray          joy
## 42313              pray     positive
## 42314              pray     surprise
## 42315              pray        trust
## 42316               god anticipation
## 42317               god         fear
## 42318               god          joy
## 42319               god     positive
## 42320               god        trust
## 42321            change         fear
## 42322           perfect anticipation
## 42323           perfect          joy
## 42324           perfect     positive
## 42325           perfect        trust
## 42326              plan anticipation
## 42327         destroyed        anger
## 42328         destroyed         fear
## 42329         destroyed     negative
## 42330         destroyed      sadness
## 42331              wise     positive
## 42332             faith anticipation
## 42333             faith          joy
## 42334             faith     positive
## 42335             faith        trust
## 42336            church anticipation
## 42337            church          joy
## 42338            church     positive
## 42339            church        trust
## 42340            change         fear
## 42341              damn        anger
## 42342              damn      disgust
## 42343              damn     negative
## 42344             money        anger
## 42345             money anticipation
## 42346             money          joy
## 42347             money     positive
## 42348             money     surprise
## 42349             money        trust
## 42350            change         fear
## 42351              time anticipation
## 42352          preserve     positive
## 42353               god anticipation
## 42354               god         fear
## 42355               god          joy
## 42356               god     positive
## 42357               god        trust
## 42358            change         fear
## 42359              real     positive
## 42360              real        trust
## 42361            change         fear
## 42362              flaw     negative
## 42363              flaw      sadness
## 42364          personal        trust
## 42365              deal anticipation
## 42366              deal          joy
## 42367              deal     positive
## 42368              deal     surprise
## 42369              deal        trust
## 42370              save          joy
## 42371              save     positive
## 42372              save        trust
## 42373               god anticipation
## 42374               god         fear
## 42375               god          joy
## 42376               god     positive
## 42377               god        trust
## 42378              save          joy
## 42379              save     positive
## 42380              save        trust
## 42381               god anticipation
## 42382               god         fear
## 42383               god          joy
## 42384               god     positive
## 42385               god        trust
## 42386            change         fear
## 42387          interior      disgust
## 42388          interior     positive
## 42389          interior        trust
## 42390          worrying anticipation
## 42391          worrying         fear
## 42392          worrying     negative
## 42393          worrying      sadness
## 42394            coming anticipation
## 42395             death        anger
## 42396             death anticipation
## 42397             death      disgust
## 42398             death         fear
## 42399             death     negative
## 42400             death      sadness
## 42401             death     surprise
## 42402              cult         fear
## 42403              cult     negative
## 42404           perfect anticipation
## 42405           perfect          joy
## 42406           perfect     positive
## 42407           perfect        trust
## 42408               god anticipation
## 42409               god         fear
## 42410               god          joy
## 42411               god     positive
## 42412               god        trust
## 42413              plan anticipation
## 42414               don     positive
## 42415               don        trust
## 42416             worry anticipation
## 42417             worry         fear
## 42418             worry     negative
## 42419             worry      sadness
## 42420               god anticipation
## 42421               god         fear
## 42422               god          joy
## 42423               god     positive
## 42424               god        trust
## 42425               don     positive
## 42426               don        trust
## 42427             worry anticipation
## 42428             worry         fear
## 42429             worry     negative
## 42430             worry      sadness
## 42431              lord      disgust
## 42432              lord     negative
## 42433              lord     positive
## 42434              lord        trust
## 42435              amen          joy
## 42436              amen     positive
## 42437              amen        trust
## 42438               god anticipation
## 42439               god         fear
## 42440               god          joy
## 42441               god     positive
## 42442               god        trust
## 42443             bless anticipation
## 42444             bless          joy
## 42445             bless     positive
## 42446             bless        trust
## 42447               don     positive
## 42448               don        trust
## 42449             worry anticipation
## 42450             worry         fear
## 42451             worry     negative
## 42452             worry      sadness
## 42453            change         fear
## 42454           heavily     negative
## 42455          fruitful     positive
## 42456               god anticipation
## 42457               god         fear
## 42458               god          joy
## 42459               god     positive
## 42460               god        trust
## 42461         unlimited     positive
## 42462         resources          joy
## 42463         resources     positive
## 42464         resources        trust
## 42465              shit        anger
## 42466              shit      disgust
## 42467              shit     negative
## 42468         disappear         fear
## 42469            sewage      disgust
## 42470            sewage     negative
## 42471             trash      disgust
## 42472             trash     negative
## 42473             trash      sadness
## 42474        completely     positive
## 42475         pointless     negative
## 42476         pointless      sadness
## 42477            forget     negative
## 42478            demand        anger
## 42479            demand     negative
## 42480               god anticipation
## 42481               god         fear
## 42482               god          joy
## 42483               god     positive
## 42484               god        trust
## 42485         laughable      disgust
## 42486         laughable     negative
## 42487           selfish        anger
## 42488           selfish      disgust
## 42489           selfish     negative
## 42490           enslave     negative
## 42491             petty     negative
## 42492           selfish        anger
## 42493           selfish      disgust
## 42494           selfish     negative
## 42495            church anticipation
## 42496            church          joy
## 42497            church     positive
## 42498            church        trust
## 42499              nest        trust
## 42500         resources          joy
## 42501         resources     positive
## 42502         resources        trust
## 42503            foiled     negative
## 42504             error     negative
## 42505             error      sadness
## 42506               god anticipation
## 42507               god         fear
## 42508               god          joy
## 42509               god     positive
## 42510               god        trust
## 42511              harm         fear
## 42512              harm     negative
## 42513            change         fear
## 42514       responsible     positive
## 42515       responsible        trust
## 42516            create          joy
## 42517            create     positive
## 42518          continue anticipation
## 42519          continue     positive
## 42520          continue        trust
## 42521            pretty anticipation
## 42522            pretty          joy
## 42523            pretty     positive
## 42524            pretty        trust
## 42525             lower     negative
## 42526             lower      sadness
## 42527          negative     negative
## 42528          negative      sadness
## 42529            change         fear
## 42530          continue anticipation
## 42531          continue     positive
## 42532          continue        trust
## 42533           pollute      disgust
## 42534           pollute     negative
## 42535              vote        anger
## 42536              vote anticipation
## 42537              vote          joy
## 42538              vote     negative
## 42539              vote     positive
## 42540              vote      sadness
## 42541              vote     surprise
## 42542              vote        trust
## 42543           culture     positive
## 42544               war         fear
## 42545               war     negative
## 42546           forward     positive
## 42547             build     positive
## 42548            create          joy
## 42549            create     positive
## 42550              hell        anger
## 42551              hell      disgust
## 42552              hell         fear
## 42553              hell     negative
## 42554              hell      sadness
## 42555            battle        anger
## 42556            battle     negative
## 42557       destruction        anger
## 42558       destruction     negative
## 42559      civilization     positive
## 42560      civilization        trust
## 42561           feature     positive
## 42562               bug      disgust
## 42563               bug         fear
## 42564               bug     negative
## 42565               god anticipation
## 42566               god         fear
## 42567               god          joy
## 42568               god     positive
## 42569               god        trust
## 42570             lower     negative
## 42571             lower      sadness
## 42572         cognitive     positive
## 42573              fair     positive
## 42574              lack     negative
## 42575         knowledge     positive
## 42576              love          joy
## 42577              love     positive
## 42578            change         fear
## 42579              deny        anger
## 42580              deny     negative
## 42581         incorrect     negative
## 42582     understanding     positive
## 42583     understanding        trust
## 42584              lack     negative
## 42585          religion        trust
## 42586            denial     negative
## 42587         honorable     positive
## 42588         honorable        trust
## 42589              bias        anger
## 42590              bias     negative
## 42591         cognitive     positive
## 42592        dissonance        anger
## 42593        dissonance     negative
## 42594          powerful        anger
## 42595          powerful anticipation
## 42596          powerful      disgust
## 42597          powerful         fear
## 42598          powerful          joy
## 42599          powerful     positive
## 42600          powerful        trust
## 42601            change         fear
## 42602             found          joy
## 42603             found     positive
## 42604             found        trust
## 42605              shit        anger
## 42606              shit      disgust
## 42607              shit     negative
## 42608       responsible     positive
## 42609       responsible        trust
## 42610               don     positive
## 42611               don        trust
## 42612       responsible     positive
## 42613       responsible        trust
## 42614               don     positive
## 42615               don        trust
## 42616       responsible     positive
## 42617       responsible        trust
## 42618               hit        anger
## 42619               hit     negative
## 42620           refused     negative
## 42621           refused      sadness
## 42622              wear     negative
## 42623              wear        trust
## 42624          firearms        anger
## 42625          firearms         fear
## 42626          firearms     negative
## 42627            refuse     negative
## 42628       responsible     positive
## 42629       responsible        trust
## 42630               tax     negative
## 42631               tax      sadness
## 42632             break     surprise
## 42633            change         fear
## 42634               pay anticipation
## 42635               pay          joy
## 42636               pay     positive
## 42637               pay        trust
## 42638               don     positive
## 42639               don        trust
## 42640       responsible     positive
## 42641       responsible        trust
## 42642              tale     positive
## 42643               sky     positive
## 42644               sky     positive
## 42645              save          joy
## 42646              save     positive
## 42647              save        trust
## 42648               top anticipation
## 42649               top     positive
## 42650               top        trust
## 42651          question     positive
## 42652         elucidate     positive
## 42653         elucidate        trust
## 42654          biblical     positive
## 42655               god anticipation
## 42656               god         fear
## 42657               god          joy
## 42658               god     positive
## 42659               god        trust
## 42660        playground anticipation
## 42661        playground          joy
## 42662        playground     positive
## 42663        playground     surprise
## 42664        playground        trust
## 42665          aspiring anticipation
## 42666          aspiring          joy
## 42667          aspiring     positive
## 42668          aspiring        trust
## 42669            hunter anticipation
## 42670            hunter         fear
## 42671            hunter     negative
## 42672            hunter      sadness
## 42673             godly          joy
## 42674             godly     positive
## 42675             godly        trust
## 42676             labor anticipation
## 42677             labor          joy
## 42678             labor     positive
## 42679             labor     surprise
## 42680             labor        trust
## 42681            growth     positive
## 42682         resources          joy
## 42683         resources     positive
## 42684         resources        trust
## 42685         isolation     negative
## 42686         isolation      sadness
## 42687               tax     negative
## 42688               tax      sadness
## 42689               ass     negative
## 42690          electric          joy
## 42691          electric     positive
## 42692          electric     surprise
## 42693              glow anticipation
## 42694              glow          joy
## 42695              glow     positive
## 42696              glow        trust
## 42697         abandoned        anger
## 42698         abandoned         fear
## 42699         abandoned     negative
## 42700         abandoned      sadness
## 42701         petroleum      disgust
## 42702         petroleum     negative
## 42703         petroleum     positive
## 42704         resources          joy
## 42705         resources     positive
## 42706         resources        trust
## 42707             godly          joy
## 42708             godly     positive
## 42709             godly        trust
## 42710           logical     positive
## 42711          personal        trust
## 42712             wound        anger
## 42713             wound         fear
## 42714             wound     negative
## 42715             wound      sadness
## 42716             money        anger
## 42717             money anticipation
## 42718             money          joy
## 42719             money     positive
## 42720             money     surprise
## 42721             money        trust
## 42722            coming anticipation
## 42723         ignorance     negative
## 42724         believing     positive
## 42725         believing        trust
## 42726            change         fear
## 42727          humanity          joy
## 42728          humanity     positive
## 42729          humanity        trust
## 42730             wrong     negative
## 42731         ignorance     negative
## 42732           refusal     negative
## 42733             wrong     negative
## 42734               aid     positive
## 42735            change         fear
## 42736           economy        trust
## 42737            change         fear
## 42738          religion        trust
## 42739          humanity          joy
## 42740          humanity     positive
## 42741          humanity        trust
## 42742           screwed        anger
## 42743           screwed     negative
## 42744              fake     negative
## 42745            denial     negative
## 42746               god anticipation
## 42747               god         fear
## 42748               god          joy
## 42749               god     positive
## 42750               god        trust
## 42751           protect     positive
## 42752              hell        anger
## 42753              hell      disgust
## 42754              hell         fear
## 42755              hell     negative
## 42756              hell      sadness
## 42757          practice     positive
## 42758               bad        anger
## 42759               bad      disgust
## 42760               bad         fear
## 42761               bad     negative
## 42762               bad      sadness
## 42763               god anticipation
## 42764               god         fear
## 42765               god          joy
## 42766               god     positive
## 42767               god        trust
## 42768           rapture anticipation
## 42769           rapture          joy
## 42770           rapture     positive
## 42771          religion        trust
## 42772           pretend     negative
## 42773             pious      disgust
## 42774             pious     positive
## 42775             pious      sadness
## 42776             pious        trust
## 42777        ultimately anticipation
## 42778        ultimately     positive
## 42779         destroyed        anger
## 42780         destroyed         fear
## 42781         destroyed     negative
## 42782         destroyed      sadness
## 42783              deal anticipation
## 42784              deal          joy
## 42785              deal     positive
## 42786              deal     surprise
## 42787              deal        trust
## 42788              real     positive
## 42789              real        trust
## 42790            reason     positive
## 42791            virgin     positive
## 42792            virgin        trust
## 42793             birth anticipation
## 42794             birth         fear
## 42795             birth          joy
## 42796             birth     positive
## 42797             birth        trust
## 42798            happen anticipation
## 42799              word     positive
## 42800              word        trust
## 42801          argument        anger
## 42802          argument     negative
## 42803             faith anticipation
## 42804             faith          joy
## 42805             faith     positive
## 42806             faith        trust
## 42807              kick        anger
## 42808              kick     negative
## 42809          believer        trust
## 42810            proven        trust
## 42811             wrong     negative
## 42812              butt     negative
## 42813              hurt        anger
## 42814              hurt         fear
## 42815              hurt     negative
## 42816              hurt      sadness
## 42817               god anticipation
## 42818               god         fear
## 42819               god          joy
## 42820               god     positive
## 42821               god        trust
## 42822          nonsense     negative
## 42823        delusional        anger
## 42824        delusional         fear
## 42825        delusional     negative
## 42826           explain     positive
## 42827           explain        trust
## 42828        delusional        anger
## 42829        delusional         fear
## 42830        delusional     negative
## 42831        ultimately anticipation
## 42832        ultimately     positive
## 42833            futile     negative
## 42834            futile      sadness
## 42835        delusional        anger
## 42836        delusional         fear
## 42837        delusional     negative
## 42838         authority     positive
## 42839         authority        trust
## 42840         difficult         fear
## 42841               god anticipation
## 42842               god         fear
## 42843               god          joy
## 42844               god     positive
## 42845               god        trust
## 42846            change         fear
## 42847              real     positive
## 42848              real        trust
## 42849               god anticipation
## 42850               god         fear
## 42851               god          joy
## 42852               god     positive
## 42853               god        trust
## 42854          argument        anger
## 42855          argument     negative
## 42856            chance     surprise
## 42857           winning anticipation
## 42858           winning      disgust
## 42859           winning          joy
## 42860           winning     positive
## 42861           winning      sadness
## 42862           winning     surprise
## 42863           winning        trust
## 42864         statement     positive
## 42865         statement        trust
## 42866               god anticipation
## 42867               god         fear
## 42868               god          joy
## 42869               god     positive
## 42870               god        trust
## 42871          dominion         fear
## 42872          dominion        trust
## 42873       translation        trust
## 42874          theology anticipation
## 42875          theology anticipation
## 42876             argue        anger
## 42877             argue     negative
## 42878              word     positive
## 42879              word        trust
## 42880          dominion         fear
## 42881          dominion        trust
## 42882          theology anticipation
## 42883              love          joy
## 42884              love     positive
## 42885            change         fear
## 42886               god anticipation
## 42887               god         fear
## 42888               god          joy
## 42889               god     positive
## 42890               god        trust
## 42891            forbid     negative
## 42892            forbid      sadness
## 42893           rapture anticipation
## 42894           rapture          joy
## 42895           rapture     positive
## 42896            change         fear
## 42897        population     positive
## 42898            denial     negative
## 42899          politics        anger
## 42900             money        anger
## 42901             money anticipation
## 42902             money          joy
## 42903             money     positive
## 42904             money     surprise
## 42905             money        trust
## 42906              real     positive
## 42907              real        trust
## 42908            denial     negative
## 42909            church anticipation
## 42910            church          joy
## 42911            church     positive
## 42912            church        trust
## 42913             visit     positive
## 42914            pastor          joy
## 42915            pastor     positive
## 42916            pastor        trust
## 42917        outlandish     negative
## 42918              crap      disgust
## 42919              crap     negative
## 42920          question     positive
## 42921             solid     positive
## 42922             angry        anger
## 42923             angry      disgust
## 42924             angry     negative
## 42925             wrong     negative
## 42926             angry        anger
## 42927             angry      disgust
## 42928             angry     negative
## 42929            reason     positive
## 42930               ill        anger
## 42931               ill      disgust
## 42932               ill         fear
## 42933               ill     negative
## 42934               ill      sadness
## 42935           patient anticipation
## 42936           patient     positive
## 42937        comprehend     positive
## 42938              cold     negative
## 42939          question     positive
## 42940              seek anticipation
## 42941           prevent         fear
## 42942       responsible     positive
## 42943       responsible        trust
## 42944            church anticipation
## 42945            church          joy
## 42946            church     positive
## 42947            church        trust
## 42948            result anticipation
## 42949        delusional        anger
## 42950        delusional         fear
## 42951        delusional     negative
## 42952            change         fear
## 42953          religion        trust
## 42954             found          joy
## 42955             found     positive
## 42956             found        trust
## 42957            change         fear
## 42958              hoax        anger
## 42959              hoax      disgust
## 42960              hoax     negative
## 42961              hoax      sadness
## 42962              hoax     surprise
## 42963             wrong     negative
## 42964            change         fear
## 42965              real     positive
## 42966              real        trust
## 42967               bad        anger
## 42968               bad      disgust
## 42969               bad         fear
## 42970               bad     negative
## 42971               bad      sadness
## 42972          guzzling     negative
## 42973          cheering          joy
## 42974          cheering     positive
## 42975             toxic      disgust
## 42976             toxic     negative
## 42977          drinking     negative
## 42978               bad        anger
## 42979               bad      disgust
## 42980               bad         fear
## 42981               bad     negative
## 42982               bad      sadness
## 42983            change         fear
## 42984              real     positive
## 42985              real        trust
## 42986               eat     positive
## 42987       intercourse     positive
## 42988            church anticipation
## 42989            church          joy
## 42990            church     positive
## 42991            church        trust
## 42992               god anticipation
## 42993               god         fear
## 42994               god          joy
## 42995               god     positive
## 42996               god        trust
## 42997         destroyed        anger
## 42998         destroyed         fear
## 42999         destroyed     negative
## 43000         destroyed      sadness
## 43001            ignore     negative
## 43002          reaffirm     positive
## 43003               god anticipation
## 43004               god         fear
## 43005               god          joy
## 43006               god     positive
## 43007               god        trust
## 43008           perfect anticipation
## 43009           perfect          joy
## 43010           perfect     positive
## 43011           perfect        trust
## 43012            loving          joy
## 43013            loving     positive
## 43014            loving        trust
## 43015               god anticipation
## 43016               god         fear
## 43017               god          joy
## 43018               god     positive
## 43019               god        trust
## 43020              wait anticipation
## 43021              wait     negative
## 43022               god anticipation
## 43023               god         fear
## 43024               god          joy
## 43025               god     positive
## 43026               god        trust
## 43027     understanding     positive
## 43028     understanding        trust
## 43029       complicated     negative
## 43030        depressing      disgust
## 43031        depressing     negative
## 43032        depressing      sadness
## 43033           related        trust
## 43034               god anticipation
## 43035               god         fear
## 43036               god          joy
## 43037               god     positive
## 43038               god        trust
## 43039            change         fear
## 43040          offended        anger
## 43041          offended     negative
## 43042          offended      sadness
## 43043      reproductive          joy
## 43044      reproductive     positive
## 43045          audacity     negative
## 43046               god anticipation
## 43047               god         fear
## 43048               god          joy
## 43049               god     positive
## 43050               god        trust
## 43051          deformed      disgust
## 43052          deformed     negative
## 43053          deformed      sadness
## 43054          majority          joy
## 43055          majority     positive
## 43056          majority        trust
## 43057            combat        anger
## 43058            combat         fear
## 43059            combat     negative
## 43060            reform     positive
## 43061          majority          joy
## 43062          majority     positive
## 43063          majority        trust
## 43064          nonsense     negative
## 43065          pathetic      disgust
## 43066          pathetic     negative
## 43067          pathetic      sadness
## 43068            greedy      disgust
## 43069            greedy     negative
## 43070              lose        anger
## 43071              lose      disgust
## 43072              lose         fear
## 43073              lose     negative
## 43074              lose      sadness
## 43075              lose     surprise
## 43076              save          joy
## 43077              save     positive
## 43078              save        trust
## 43079            reason     positive
## 43080          humanity          joy
## 43081          humanity     positive
## 43082          humanity        trust
## 43083            change         fear
## 43084        uneducated     negative
## 43085        uneducated      sadness
## 43086             lower     negative
## 43087             lower      sadness
## 43088            greedy      disgust
## 43089            greedy     negative
## 43090            change         fear
## 43091         knowledge     positive
## 43092       selfishness     negative
## 43093            change         fear
## 43094          agreeing     positive
## 43095          agreeing        trust
## 43096           poverty        anger
## 43097           poverty      disgust
## 43098           poverty         fear
## 43099           poverty     negative
## 43100           poverty      sadness
## 43101          fighting        anger
## 43102          fighting     negative
## 43103            change         fear
## 43104            change         fear
## 43105          suddenly     surprise
## 43106               bad        anger
## 43107               bad      disgust
## 43108               bad         fear
## 43109               bad     negative
## 43110               bad      sadness
## 43111           enslave     negative
## 43112        capitalist     positive
## 43113               don     positive
## 43114               don        trust
## 43115             coach        trust
## 43116            change         fear
## 43117              real     positive
## 43118              real        trust
## 43119         pollution      disgust
## 43120         pollution     negative
## 43121            damage        anger
## 43122            damage      disgust
## 43123            damage     negative
## 43124            damage      sadness
## 43125             green          joy
## 43126             green     positive
## 43127             green        trust
## 43128             money        anger
## 43129             money anticipation
## 43130             money          joy
## 43131             money     positive
## 43132             money     surprise
## 43133             money        trust
## 43134               don     positive
## 43135               don        trust
## 43136             flood         fear
## 43137              dumb     negative
## 43138              shot        anger
## 43139              shot         fear
## 43140              shot     negative
## 43141              shot      sadness
## 43142              shot     surprise
## 43143               don     positive
## 43144               don        trust
## 43145              real     positive
## 43146              real        trust
## 43147          prophecy anticipation
## 43148              real     positive
## 43149              real        trust
## 43150             angry        anger
## 43151             angry      disgust
## 43152             angry     negative
## 43153             wrath        anger
## 43154             wrath         fear
## 43155             wrath     negative
## 43156              time anticipation
## 43157            revere anticipation
## 43158            revere          joy
## 43159            revere     positive
## 43160            revere        trust
## 43161        destroying        anger
## 43162        destroying         fear
## 43163        destroying     negative
## 43164        destroying      sadness
## 43165              wise     positive
## 43166               god anticipation
## 43167               god         fear
## 43168               god          joy
## 43169               god     positive
## 43170               god        trust
## 43171             clean          joy
## 43172             clean     positive
## 43173             clean        trust
## 43174               don     positive
## 43175               don        trust
## 43176             leave     negative
## 43177             leave      sadness
## 43178             leave     surprise
## 43179              mess      disgust
## 43180              mess     negative
## 43181             clean          joy
## 43182             clean     positive
## 43183             clean        trust
## 43184           gradual anticipation
## 43185          lobbyist     negative
## 43186            debate     positive
## 43187              lost     negative
## 43188              lost      sadness
## 43189            purity     positive
## 43190            purity     surprise
## 43191          fighting        anger
## 43192          fighting     negative
## 43193             clean          joy
## 43194             clean     positive
## 43195             clean        trust
## 43196           pollute      disgust
## 43197           pollute     negative
## 43198               die         fear
## 43199               die     negative
## 43200               die      sadness
## 43201           exhaust     negative
## 43202       radioactive         fear
## 43203       radioactive     negative
## 43204             waste      disgust
## 43205             waste     negative
## 43206             waste      disgust
## 43207             waste     negative
## 43208        completely     positive
## 43209         radiation         fear
## 43210         radiation     negative
## 43211              food          joy
## 43212              food     positive
## 43213              food        trust
## 43214       radioactive         fear
## 43215       radioactive     negative
## 43216               eat     positive
## 43217         radiation         fear
## 43218         radiation     negative
## 43219              true          joy
## 43220              true     positive
## 43221              true        trust
## 43222          solution     positive
## 43223              ship anticipation
## 43224         protected        trust
## 43225      intellectual     positive
## 43226         protected        trust
## 43227      intellectual     positive
## 43228           related        trust
## 43229           benefit     positive
## 43230            patent     positive
## 43231        insolvency         fear
## 43232        insolvency     negative
## 43233        insolvency      sadness
## 43234        insolvency     surprise
## 43235             argue        anger
## 43236             argue     negative
## 43237            remove        anger
## 43238            remove         fear
## 43239            remove     negative
## 43240            remove      sadness
## 43241               pay anticipation
## 43242               pay          joy
## 43243               pay     positive
## 43244               pay        trust
## 43245              risk anticipation
## 43246              risk         fear
## 43247              risk     negative
## 43248        insolvency         fear
## 43249        insolvency     negative
## 43250        insolvency      sadness
## 43251        insolvency     surprise
## 43252            damage        anger
## 43253            damage      disgust
## 43254            damage     negative
## 43255            damage      sadness
## 43256              risk anticipation
## 43257              risk         fear
## 43258              risk     negative
## 43259             cheap     negative
## 43260              risk anticipation
## 43261              risk         fear
## 43262              risk     negative
## 43263         withstand anticipation
## 43264         withstand         fear
## 43265         withstand     positive
## 43266           drought     negative
## 43267            fungus      disgust
## 43268            fungus     negative
## 43269         resistant         fear
## 43270         resistant     negative
## 43271            change         fear
## 43272            debate     positive
## 43273     controversial        anger
## 43274     controversial     negative
## 43275             draft anticipation
## 43276         laborious     negative
## 43277              plan anticipation
## 43278         establish        trust
## 43279            create          joy
## 43280            create     positive
## 43281       traditional     positive
## 43282           include     positive
## 43283         withstand anticipation
## 43284         withstand         fear
## 43285         withstand     positive
## 43286           drought     negative
## 43287         resistant         fear
## 43288         resistant     negative
## 43289            fungus      disgust
## 43290            fungus     negative
## 43291             vital     positive
## 43292           drought     negative
## 43293           forward     positive
## 43294        commission        trust
## 43295          official        trust
## 43296            change         fear
## 43297              food          joy
## 43298              food     positive
## 43299              food        trust
## 43300        regulatory         fear
## 43301        regulatory     negative
## 43302              risk anticipation
## 43303              risk         fear
## 43304              risk     negative
## 43305        assessment     surprise
## 43306        assessment        trust
## 43307       established          joy
## 43308       established     positive
## 43309             draft anticipation
## 43310       traditional     positive
## 43311           leading        trust
## 43312         resistant         fear
## 43313         resistant     negative
## 43314           foreign     negative
## 43315        contribute     positive
## 43316              food          joy
## 43317              food     positive
## 43318              food        trust
## 43319            system        trust
## 43320             label        trust
## 43321            public anticipation
## 43322            public     positive
## 43323        opposition        anger
## 43324        opposition     negative
## 43325            oppose     negative
## 43326        relaxation     positive
## 43327            coming anticipation
## 43328           granted     positive
## 43329               don     positive
## 43330               don        trust
## 43331               top anticipation
## 43332               top     positive
## 43333               top        trust
## 43334             court        anger
## 43335             court anticipation
## 43336             court         fear
## 43337              pose     negative
## 43338            danger         fear
## 43339            danger     negative
## 43340            danger      sadness
## 43341           careful     positive
## 43342         resistant         fear
## 43343         resistant     negative
## 43344            result anticipation
## 43345         resistant         fear
## 43346         resistant     negative
## 43347             weeds     negative
## 43348             weeds      sadness
## 43349             green          joy
## 43350             green     positive
## 43351             green        trust
## 43352        parliament        trust
## 43353           approve          joy
## 43354           approve     positive
## 43355           approve        trust
## 43356            oppose     negative
## 43357            change         fear
## 43358             agree     positive
## 43359          familiar     positive
## 43360          familiar        trust
## 43361             argue        anger
## 43362             argue     negative
## 43363       bureaucracy     negative
## 43364       bureaucracy        trust
## 43365         effective     positive
## 43366         effective        trust
## 43367               ban     negative
## 43368           nervous anticipation
## 43369           nervous         fear
## 43370           nervous     negative
## 43371          official        trust
## 43372              food          joy
## 43373              food     positive
## 43374              food        trust
## 43375              deal anticipation
## 43376              deal          joy
## 43377              deal     positive
## 43378              deal     surprise
## 43379              deal        trust
## 43380            change         fear
## 43381           crystal     positive
## 43382            broken        anger
## 43383            broken         fear
## 43384            broken     negative
## 43385            broken      sadness
## 43386             clock anticipation
## 43387        opposition        anger
## 43388        opposition     negative
## 43389           blinded     negative
## 43390             ready anticipation
## 43391             stone        anger
## 43392             stone     negative
## 43393           harvest anticipation
## 43394           harvest          joy
## 43395           harvest     positive
## 43396       traditional     positive
## 43397       unfulfilled        anger
## 43398       unfulfilled anticipation
## 43399       unfulfilled     negative
## 43400       unfulfilled      sadness
## 43401       unfulfilled     surprise
## 43402           promise          joy
## 43403           promise     positive
## 43404           promise        trust
## 43405           failing        anger
## 43406           failing anticipation
## 43407           failing         fear
## 43408           failing     negative
## 43409           failing      sadness
## 43410             blame        anger
## 43411             blame      disgust
## 43412             blame     negative
## 43413             green          joy
## 43414             green     positive
## 43415             green        trust
## 43416        parliament        trust
## 43417           approve          joy
## 43418           approve     positive
## 43419           approve        trust
## 43420            oppose     negative
## 43421            change         fear
## 43422             green          joy
## 43423             green     positive
## 43424             green        trust
## 43425              save          joy
## 43426              save     positive
## 43427              save        trust
## 43428              vote        anger
## 43429              vote anticipation
## 43430              vote          joy
## 43431              vote     negative
## 43432              vote     positive
## 43433              vote      sadness
## 43434              vote     surprise
## 43435              vote        trust
## 43436              save          joy
## 43437              save     positive
## 43438              save        trust
## 43439              vote        anger
## 43440              vote anticipation
## 43441              vote          joy
## 43442              vote     negative
## 43443              vote     positive
## 43444              vote      sadness
## 43445              vote     surprise
## 43446              vote        trust
## 43447        scientific     positive
## 43448        scientific        trust
## 43449      intellectual     positive
## 43450            patent     positive
## 43451         dependent     negative
## 43452         dependent     positive
## 43453         dependent        trust
## 43454           foreign     negative
## 43455      intellectual     positive
## 43456              food          joy
## 43457              food     positive
## 43458              food        trust
## 43459        permission     positive
## 43460               fun anticipation
## 43461               fun          joy
## 43462               fun     positive
## 43463      intellectual     positive
## 43464           primary     positive
## 43465      intellectual     positive
## 43466         strategic     positive
## 43467          gigantic     positive
## 43468       competition anticipation
## 43469       competition     negative
## 43470              late     negative
## 43471              late      sadness
## 43472            cancer        anger
## 43473            cancer      disgust
## 43474            cancer         fear
## 43475            cancer     negative
## 43476            cancer      sadness
## 43477              mess      disgust
## 43478              mess     negative
## 43479              food          joy
## 43480              food     positive
## 43481              food        trust
## 43482            depend anticipation
## 43483            depend        trust
## 43484            change         fear
## 43485       agriculture     positive
## 43486              time anticipation
## 43487         unnatural      disgust
## 43488         unnatural         fear
## 43489         unnatural     negative
## 43490              hell        anger
## 43491              hell      disgust
## 43492              hell         fear
## 43493              hell     negative
## 43494              hell      sadness
## 43495         radiation         fear
## 43496         radiation     negative
## 43497            create          joy
## 43498            create     positive
## 43499           organic     positive
## 43500              fear        anger
## 43501              fear         fear
## 43502              fear     negative
## 43503    disinformation        anger
## 43504    disinformation         fear
## 43505    disinformation     negative
## 43506            modify     surprise
## 43507         practiced          joy
## 43508         practiced     positive
## 43509         practiced     surprise
## 43510         practiced        trust
## 43511            modify     surprise
## 43512             lower     negative
## 43513             lower      sadness
## 43514           precise     positive
## 43515           organic     positive
## 43516             sadly     negative
## 43517             sadly      sadness
## 43518           organic     positive
## 43519         hilarious          joy
## 43520         hilarious     positive
## 43521         hilarious     surprise
## 43522            modify     surprise
## 43523              evil        anger
## 43524              evil      disgust
## 43525              evil         fear
## 43526              evil     negative
## 43527              evil      sadness
## 43528            result anticipation
## 43529            proper     positive
## 43530            pretty anticipation
## 43531            pretty          joy
## 43532            pretty     positive
## 43533            pretty        trust
## 43534              tree        anger
## 43535              tree anticipation
## 43536              tree      disgust
## 43537              tree          joy
## 43538              tree     positive
## 43539              tree     surprise
## 43540              tree        trust
## 43541           disease        anger
## 43542           disease      disgust
## 43543           disease         fear
## 43544           disease     negative
## 43545           disease      sadness
## 43546         resistant         fear
## 43547         resistant     negative
## 43548               god anticipation
## 43549               god         fear
## 43550               god          joy
## 43551               god     positive
## 43552               god        trust
## 43553              hate        anger
## 43554              hate      disgust
## 43555              hate         fear
## 43556              hate     negative
## 43557              hate      sadness
## 43558           pretend     negative
## 43559              time anticipation
## 43560          reliable     positive
## 43561          reliable        trust
## 43562              tree        anger
## 43563              tree anticipation
## 43564              tree      disgust
## 43565              tree          joy
## 43566              tree     positive
## 43567              tree     surprise
## 43568              tree        trust
## 43569               god anticipation
## 43570               god         fear
## 43571               god          joy
## 43572               god     positive
## 43573               god        trust
## 43574         guarantee     positive
## 43575         guarantee        trust
## 43576              star anticipation
## 43577              star          joy
## 43578              star     positive
## 43579              star        trust
## 43580              real     positive
## 43581              real        trust
## 43582              risk anticipation
## 43583              risk         fear
## 43584              risk     negative
## 43585     contamination      disgust
## 43586     contamination     negative
## 43587           disease        anger
## 43588           disease      disgust
## 43589           disease         fear
## 43590           disease     negative
## 43591           disease      sadness
## 43592             avoid         fear
## 43593             avoid     negative
## 43594     understanding     positive
## 43595     understanding        trust
## 43596              tree        anger
## 43597              tree anticipation
## 43598              tree      disgust
## 43599              tree          joy
## 43600              tree     positive
## 43601              tree     surprise
## 43602              tree        trust
## 43603          argument        anger
## 43604          argument     negative
## 43605              moot     negative
## 43606            danger         fear
## 43607            danger     negative
## 43608            danger      sadness
## 43609              wild     negative
## 43610              wild     surprise
## 43611         nightmare         fear
## 43612         nightmare     negative
## 43613          practice     positive
## 43614              grow anticipation
## 43615              grow          joy
## 43616              grow     positive
## 43617              grow        trust
## 43618            presto          joy
## 43619            presto     positive
## 43620            presto     surprise
## 43621           clarify     positive
## 43622         knowledge     positive
## 43623            refuse     negative
## 43624           clarify     positive
## 43625              word     positive
## 43626              word        trust
## 43627              lack     negative
## 43628           reading     positive
## 43629         arrogance     negative
## 43630          ignorant      disgust
## 43631          ignorant     negative
## 43632           clarify     positive
## 43633              word     positive
## 43634              word        trust
## 43635              word     positive
## 43636              word        trust
## 43637             guess     surprise
## 43638              fair     positive
## 43639            mother anticipation
## 43640            mother          joy
## 43641            mother     negative
## 43642            mother     positive
## 43643            mother      sadness
## 43644            mother        trust
## 43645              word     positive
## 43646              word        trust
## 43647              word     positive
## 43648              word        trust
## 43649              word     positive
## 43650              word        trust
## 43651              word     positive
## 43652              word        trust
## 43653          intended anticipation
## 43654          intended     positive
## 43655           cutting        anger
## 43656           cutting      disgust
## 43657           cutting         fear
## 43658           cutting     negative
## 43659           cutting      sadness
## 43660      disappointed        anger
## 43661      disappointed      disgust
## 43662      disappointed     negative
## 43663      disappointed      sadness
## 43664            honest        anger
## 43665            honest      disgust
## 43666            honest         fear
## 43667            honest          joy
## 43668            honest     positive
## 43669            honest      sadness
## 43670            honest        trust
## 43671              talk     positive
## 43672           include     positive
## 43673            result anticipation
## 43674               fun anticipation
## 43675               fun          joy
## 43676               fun     positive
## 43677        cultivated     positive
## 43678             wrong     negative
## 43679         dangerous         fear
## 43680         dangerous     negative
## 43681             broke         fear
## 43682             broke     negative
## 43683             broke      sadness
## 43684         radiation         fear
## 43685         radiation     negative
## 43686               hit        anger
## 43687               hit     negative
## 43688            pretty anticipation
## 43689            pretty          joy
## 43690            pretty     positive
## 43691            pretty        trust
## 43692              food          joy
## 43693              food     positive
## 43694              food        trust
## 43695             wrong     negative
## 43696             wrong     negative
## 43697           explain     positive
## 43698           explain        trust
## 43699        protecting     positive
## 43700        protecting        trust
## 43701          inventor     positive
## 43702              risk anticipation
## 43703              risk         fear
## 43704              risk     negative
## 43705              food          joy
## 43706              food     positive
## 43707              food        trust
## 43708            income anticipation
## 43709            income          joy
## 43710            income     negative
## 43711            income     positive
## 43712            income      sadness
## 43713            income        trust
## 43714             greed        anger
## 43715             greed      disgust
## 43716             greed     negative
## 43717        technology     positive
## 43718         automatic        trust
## 43719           harvest anticipation
## 43720           harvest          joy
## 43721           harvest     positive
## 43722            manual        trust
## 43723            create          joy
## 43724            create     positive
## 43725         resistant         fear
## 43726         resistant     negative
## 43727            unable     negative
## 43728            unable      sadness
## 43729             greed        anger
## 43730             greed      disgust
## 43731             greed     negative
## 43732             force        anger
## 43733             force         fear
## 43734             force     negative
## 43735        innovation     positive
## 43736              food          joy
## 43737              food     positive
## 43738              food        trust
## 43739             money        anger
## 43740             money anticipation
## 43741             money          joy
## 43742             money     positive
## 43743             money     surprise
## 43744             money        trust
## 43745          continue anticipation
## 43746          continue     positive
## 43747          continue        trust
## 43748            losing        anger
## 43749            losing     negative
## 43750            losing      sadness
## 43751               don     positive
## 43752               don        trust
## 43753             lying        anger
## 43754             lying      disgust
## 43755             lying     negative
## 43756           harvest anticipation
## 43757           harvest          joy
## 43758           harvest     positive
## 43759        productive     positive
## 43760             store anticipation
## 43761             store     positive
## 43762             clean          joy
## 43763             clean     positive
## 43764             clean        trust
## 43765              time anticipation
## 43766         resources          joy
## 43767         resources     positive
## 43768         resources        trust
## 43769             tough     negative
## 43770             tough      sadness
## 43771              luck anticipation
## 43772              luck          joy
## 43773              luck     positive
## 43774              luck     surprise
## 43775             waste      disgust
## 43776             waste     negative
## 43777         retention     positive
## 43778          prepared anticipation
## 43779          prepared     positive
## 43780          prepared        trust
## 43781             store anticipation
## 43782             store     positive
## 43783         advantage     positive
## 43784             vigor     positive
## 43785         carefully     positive
## 43786         desirable     positive
## 43787               don     positive
## 43788               don        trust
## 43789        productive     positive
## 43790               bad        anger
## 43791               bad      disgust
## 43792               bad         fear
## 43793               bad     negative
## 43794               bad      sadness
## 43795            result anticipation
## 43796          constant     positive
## 43797          constant        trust
## 43798        permission     positive
## 43799        innovation     positive
## 43800            degree     positive
## 43801             prove     positive
## 43802      productivity     positive
## 43803        completely     positive
## 43804           explain     positive
## 43805           explain        trust
## 43806           harvest anticipation
## 43807           harvest          joy
## 43808           harvest     positive
## 43809              time anticipation
## 43810            odious        anger
## 43811            odious      disgust
## 43812            odious         fear
## 43813            odious     negative
## 43814             happy anticipation
## 43815             happy          joy
## 43816             happy     positive
## 43817             happy        trust
## 43818             share anticipation
## 43819             share          joy
## 43820             share     positive
## 43821             share        trust
## 43822      difficulties     negative
## 43823      difficulties      sadness
## 43824          question     positive
## 43825               don     positive
## 43826               don        trust
## 43827             money        anger
## 43828             money anticipation
## 43829             money          joy
## 43830             money     positive
## 43831             money     surprise
## 43832             money        trust
## 43833               don     positive
## 43834               don        trust
## 43835             level     positive
## 43836             level        trust
## 43837             happy anticipation
## 43838             happy          joy
## 43839             happy     positive
## 43840             happy        trust
## 43841             share anticipation
## 43842             share          joy
## 43843             share     positive
## 43844             share        trust
## 43845              true          joy
## 43846              true     positive
## 43847              true        trust
## 43848           subject     negative
## 43849               don     positive
## 43850               don        trust
## 43851      intellectual     positive
## 43852             wrong     negative
## 43853      intellectual     positive
## 43854            patent     positive
## 43855           expired     negative
## 43856            patent     positive
## 43857            patent     positive
## 43858            patent     positive
## 43859           granted     positive
## 43860            patent     positive
## 43861              true          joy
## 43862              true     positive
## 43863              true        trust
## 43864              true          joy
## 43865              true     positive
## 43866              true        trust
## 43867          majority          joy
## 43868          majority     positive
## 43869          majority        trust
## 43870              true          joy
## 43871              true     positive
## 43872              true        trust
## 43873            public anticipation
## 43874            public     positive
## 43875         knowledge     positive
## 43876            public anticipation
## 43877            public     positive
## 43878         encourage          joy
## 43879         encourage     positive
## 43880         encourage        trust
## 43881          stealing      disgust
## 43882          stealing         fear
## 43883          stealing     negative
## 43884           foreign     negative
## 43885              lose        anger
## 43886              lose      disgust
## 43887              lose         fear
## 43888              lose     negative
## 43889              lose      sadness
## 43890              lose     surprise
## 43891             spent     negative
## 43892        delusional        anger
## 43893        delusional         fear
## 43894        delusional     negative
## 43895            patent     positive
## 43896             theft        anger
## 43897             theft      disgust
## 43898             theft         fear
## 43899             theft     negative
## 43900             theft      sadness
## 43901              time anticipation
## 43902             steal        anger
## 43903             steal         fear
## 43904             steal     negative
## 43905             steal      sadness
## 43906        technology     positive
## 43907              damn        anger
## 43908              damn      disgust
## 43909              damn     negative
## 43910            stolen        anger
## 43911            stolen     negative
## 43912          suddenly     surprise
## 43913             start anticipation
## 43914             trade        trust
## 43915               war         fear
## 43916               war     negative
## 43917            patent     positive
## 43918           default      disgust
## 43919           default         fear
## 43920           default     negative
## 43921           default      sadness
## 43922      intellectual     positive
## 43923             guess     surprise
## 43924            patent     positive
## 43925            ignore     negative
## 43926             court        anger
## 43927             court anticipation
## 43928             court         fear
## 43929             trade        trust
## 43930               war         fear
## 43931               war     negative
## 43932             silly          joy
## 43933             silly     negative
## 43934            afford     positive
## 43935              time anticipation
## 43936          struggle        anger
## 43937          struggle         fear
## 43938          struggle     negative
## 43939          struggle      sadness
## 43940              kick        anger
## 43941              kick     negative
## 43942             start anticipation
## 43943             giant         fear
## 43944          contrary     negative
## 43945             trade        trust
## 43946               war         fear
## 43947               war     negative
## 43948              rest     positive
## 43949             doubt         fear
## 43950             doubt     negative
## 43951             doubt      sadness
## 43952             doubt        trust
## 43953          learning     positive
## 43954               law        trust
## 43955         resistant         fear
## 43956         resistant     negative
## 43957           healthy     positive
## 43958              food          joy
## 43959              food     positive
## 43960              food        trust
## 43961        efficiency     positive
## 43962            demand        anger
## 43963            demand     negative
## 43964              true          joy
## 43965              true     positive
## 43966              true        trust
## 43967               don     positive
## 43968               don        trust
## 43969        ultimately anticipation
## 43970        ultimately     positive
## 43971              lead     positive
## 43972       traditional     positive
## 43973              risk anticipation
## 43974              risk         fear
## 43975              risk     negative
## 43976            famine     negative
## 43977            famine      sadness
## 43978           disease        anger
## 43979           disease      disgust
## 43980           disease         fear
## 43981           disease     negative
## 43982           disease      sadness
## 43983             legal     positive
## 43984             legal        trust
## 43985             avoid         fear
## 43986             avoid     negative
## 43987              risk anticipation
## 43988              risk         fear
## 43989              risk     negative
## 43990              glad anticipation
## 43991              glad          joy
## 43992              glad     positive
## 43993              lead     positive
## 43994             legal     positive
## 43995             legal        trust
## 43996        capitalist     positive
## 43997        innovation     positive
## 43998         dependent     negative
## 43999         dependent     positive
## 44000         dependent        trust
## 44001            parrot      disgust
## 44002            parrot     negative
## 44003             break     surprise
## 44004            losing        anger
## 44005            losing     negative
## 44006            losing      sadness
## 44007              bite     negative
## 44008              mess      disgust
## 44009              mess     negative
## 44010              real     positive
## 44011              real        trust
## 44012              lose        anger
## 44013              lose      disgust
## 44014              lose         fear
## 44015              lose     negative
## 44016              lose      sadness
## 44017              lose     surprise
## 44018          intended anticipation
## 44019          intended     positive
## 44020           worried     negative
## 44021           worried      sadness
## 44022              lose        anger
## 44023              lose      disgust
## 44024              lose         fear
## 44025              lose     negative
## 44026              lose      sadness
## 44027              lose     surprise
## 44028            reason     positive
## 44029          mourning     negative
## 44030          mourning      sadness
## 44031           healthy     positive
## 44032        conspiracy         fear
## 44033               bad        anger
## 44034               bad      disgust
## 44035               bad         fear
## 44036               bad     negative
## 44037               bad      sadness
## 44038             blame        anger
## 44039             blame      disgust
## 44040             blame     negative
## 44041             death        anger
## 44042             death anticipation
## 44043             death      disgust
## 44044             death         fear
## 44045             death     negative
## 44046             death      sadness
## 44047             death     surprise
## 44048        technology     positive
## 44049            giving     positive
## 44050            father        trust
## 44051         skeptical     negative
## 44052        scientific     positive
## 44053        scientific        trust
## 44054        scientific     positive
## 44055        scientific        trust
## 44056           crystal     positive
## 44057             money        anger
## 44058             money anticipation
## 44059             money          joy
## 44060             money     positive
## 44061             money     surprise
## 44062             money        trust
## 44063               pay anticipation
## 44064               pay          joy
## 44065               pay     positive
## 44066               pay        trust
## 44067       electricity     positive
## 44068             truth     positive
## 44069             truth        trust
## 44070              time anticipation
## 44071               mad        anger
## 44072               mad      disgust
## 44073               mad         fear
## 44074               mad     negative
## 44075               mad      sadness
## 44076         arguments        anger
## 44077            purity     positive
## 44078            purity     surprise
## 44079          unsavory     negative
## 44080          intended anticipation
## 44081          intended     positive
## 44082           organic     positive
## 44083           organic     positive
## 44084           organic     positive
## 44085              love          joy
## 44086              love     positive
## 44087        conspiracy         fear
## 44088         dangerous         fear
## 44089         dangerous     negative
## 44090         oversight     negative
## 44091        horrifying      disgust
## 44092        horrifying         fear
## 44093        horrifying     negative
## 44094        horrifying      sadness
## 44095           sterile     negative
## 44096           sterile      sadness
## 44097        compatible     positive
## 44098          suddenly     surprise
## 44099            danger         fear
## 44100            danger     negative
## 44101            danger      sadness
## 44102           sterile     negative
## 44103           sterile      sadness
## 44104            supply     positive
## 44105        technology     positive
## 44106              wise     positive
## 44107        scientific     positive
## 44108        scientific        trust
## 44109           medical anticipation
## 44110           medical         fear
## 44111           medical     positive
## 44112           medical        trust
## 44113         integrity     positive
## 44114         integrity        trust
## 44115          epidemic        anger
## 44116          epidemic anticipation
## 44117          epidemic      disgust
## 44118          epidemic         fear
## 44119          epidemic     negative
## 44120          epidemic      sadness
## 44121          epidemic     surprise
## 44122    pharmaceutical     positive
## 44123           sterile     negative
## 44124           sterile      sadness
## 44125              fear        anger
## 44126              fear         fear
## 44127              fear     negative
## 44128           healthy     positive
## 44129               pop     negative
## 44130               pop     surprise
## 44131           sterile     negative
## 44132           sterile      sadness
## 44133           sterile     negative
## 44134           sterile      sadness
## 44135           sterile     negative
## 44136           sterile      sadness
## 44137          terrible        anger
## 44138          terrible      disgust
## 44139          terrible         fear
## 44140          terrible     negative
## 44141          terrible      sadness
## 44142             trend     positive
## 44143           comfort anticipation
## 44144           comfort          joy
## 44145           comfort     positive
## 44146           comfort        trust
## 44147            supply     positive
## 44148           failure      disgust
## 44149           failure         fear
## 44150           failure     negative
## 44151           failure      sadness
## 44152            losing        anger
## 44153            losing     negative
## 44154            losing      sadness
## 44155           ability     positive
## 44156            damage        anger
## 44157            damage      disgust
## 44158            damage     negative
## 44159            damage      sadness
## 44160        confidence         fear
## 44161        confidence          joy
## 44162        confidence     positive
## 44163        confidence        trust
## 44164              food          joy
## 44165              food     positive
## 44166              food        trust
## 44167         resilient     positive
## 44168          disaster        anger
## 44169          disaster      disgust
## 44170          disaster         fear
## 44171          disaster     negative
## 44172          disaster      sadness
## 44173          disaster     surprise
## 44174          nonsense     negative
## 44175           comfort anticipation
## 44176           comfort          joy
## 44177           comfort     positive
## 44178           comfort        trust
## 44179           diverse     negative
## 44180           diverse     positive
## 44181            unique     positive
## 44182            unique     surprise
## 44183         resilient     positive
## 44184           disease        anger
## 44185           disease      disgust
## 44186           disease         fear
## 44187           disease     negative
## 44188           disease      sadness
## 44189        horrifying      disgust
## 44190        horrifying         fear
## 44191        horrifying     negative
## 44192        horrifying      sadness
## 44193             enemy        anger
## 44194             enemy      disgust
## 44195             enemy         fear
## 44196             enemy     negative
## 44197             virus     negative
## 44198              kill         fear
## 44199              kill     negative
## 44200              kill      sadness
## 44201            coming anticipation
## 44202            danger         fear
## 44203            danger     negative
## 44204            danger      sadness
## 44205            damned     negative
## 44206              bomb        anger
## 44207              bomb         fear
## 44208              bomb     negative
## 44209              bomb      sadness
## 44210              bomb     surprise
## 44211        technology     positive
## 44212         discovery     positive
## 44213            giving     positive
## 44214       destructive        anger
## 44215       destructive      disgust
## 44216       destructive         fear
## 44217       destructive     negative
## 44218          morality     positive
## 44219          morality        trust
## 44220        compassion         fear
## 44221        compassion     positive
## 44222       instability      disgust
## 44223       instability         fear
## 44224       instability     negative
## 44225              food          joy
## 44226              food     positive
## 44227              food        trust
## 44228            supply     positive
## 44229         resilient     positive
## 44230            attack        anger
## 44231            attack         fear
## 44232            attack     negative
## 44233           organic     positive
## 44234            wealth          joy
## 44235            wealth     positive
## 44236            wealth        trust
## 44237           garbage      disgust
## 44238           garbage     negative
## 44239            patent     positive
## 44240           benefit     positive
## 44241            patent     positive
## 44242           protect     positive
## 44243           protect     positive
## 44244             cross        anger
## 44245             cross         fear
## 44246             cross     negative
## 44247             cross      sadness
## 44248         protected        trust
## 44249              cash        anger
## 44250              cash anticipation
## 44251              cash         fear
## 44252              cash          joy
## 44253              cash     positive
## 44254              cash        trust
## 44255          restrict     negative
## 44256          restrict      sadness
## 44257              food          joy
## 44258              food     positive
## 44259              food        trust
## 44260        production anticipation
## 44261        production     positive
## 44262     revolutionary     positive
## 44263        opposition        anger
## 44264        opposition     negative
## 44265            pretty anticipation
## 44266            pretty          joy
## 44267            pretty     positive
## 44268            pretty        trust
## 44269           obvious     positive
## 44270           obvious        trust
## 44271             vague     negative
## 44272          argument        anger
## 44273          argument     negative
## 44274             faith anticipation
## 44275             faith          joy
## 44276             faith     positive
## 44277             faith        trust
## 44278              bite     negative
## 44279           suggest        trust
## 44280             abuse        anger
## 44281             abuse      disgust
## 44282             abuse         fear
## 44283             abuse     negative
## 44284             abuse      sadness
## 44285      intellectual     positive
## 44286               law        trust
## 44287        production anticipation
## 44288        production     positive
## 44289           illegal        anger
## 44290           illegal      disgust
## 44291           illegal         fear
## 44292           illegal     negative
## 44293           illegal      sadness
## 44294        permission     positive
## 44295           organic     positive
## 44296           organic     positive
## 44297            unique     positive
## 44298            unique     surprise
## 44299        government         fear
## 44300        government     negative
## 44301              food          joy
## 44302              food     positive
## 44303              food        trust
## 44304        production anticipation
## 44305        production     positive
## 44306        production anticipation
## 44307        production     positive
## 44308           chicken         fear
## 44309         protected        trust
## 44310             abuse        anger
## 44311             abuse      disgust
## 44312             abuse         fear
## 44313             abuse     negative
## 44314             abuse      sadness
## 44315        innovation     positive
## 44316        innovation     positive
## 44317            enable     positive
## 44318            enable        trust
## 44319        innovation     positive
## 44320               eat     positive
## 44321            choice     positive
## 44322        innovation     positive
## 44323         encourage          joy
## 44324         encourage     positive
## 44325         encourage        trust
## 44326        innovation     positive
## 44327             guess     surprise
## 44328      disagreement        anger
## 44329      disagreement     negative
## 44330      disagreement      sadness
## 44331               don     positive
## 44332               don        trust
## 44333          judgment     surprise
## 44334           achieve          joy
## 44335           achieve     positive
## 44336           achieve        trust
## 44337              late     negative
## 44338              late      sadness
## 44339          advanced     positive
## 44340       agriculture     positive
## 44341         producing     positive
## 44342         resources          joy
## 44343         resources     positive
## 44344         resources        trust
## 44345             money        anger
## 44346             money anticipation
## 44347             money          joy
## 44348             money     positive
## 44349             money     surprise
## 44350             money        trust
## 44351            church anticipation
## 44352            church          joy
## 44353            church     positive
## 44354            church        trust
## 44355            forget     negative
## 44356              land     positive
## 44357              land     positive
## 44358              hell        anger
## 44359              hell      disgust
## 44360              hell         fear
## 44361              hell     negative
## 44362              hell      sadness
## 44363        productive     positive
## 44364      productivity     positive
## 44365        impossible     negative
## 44366        impossible      sadness
## 44367              food          joy
## 44368              food     positive
## 44369              food        trust
## 44370             labor anticipation
## 44371             labor          joy
## 44372             labor     positive
## 44373             labor     surprise
## 44374             labor        trust
## 44375           benefit     positive
## 44376         resistant         fear
## 44377         resistant     negative
## 44378           primary     positive
## 44379         dependent     negative
## 44380         dependent     positive
## 44381         dependent        trust
## 44382            larger      disgust
## 44383            larger     surprise
## 44384            larger        trust
## 44385              gain anticipation
## 44386              gain          joy
## 44387              gain     positive
## 44388              food          joy
## 44389              food     positive
## 44390              food        trust
## 44391         dependent     negative
## 44392         dependent     positive
## 44393         dependent        trust
## 44394         resources          joy
## 44395         resources     positive
## 44396         resources        trust
## 44397            reason     positive
## 44398              food          joy
## 44399              food     positive
## 44400              food        trust
## 44401              farm anticipation
## 44402              real     positive
## 44403              real        trust
## 44404            hazard         fear
## 44405            hazard     negative
## 44406          friendly anticipation
## 44407          friendly          joy
## 44408          friendly     positive
## 44409          friendly        trust
## 44410          invasion        anger
## 44411          invasion     negative
## 44412              real     positive
## 44413              real        trust
## 44414            reason     positive
## 44415            change         fear
## 44416              tale     positive
## 44417           explain     positive
## 44418           explain        trust
## 44419          invasion        anger
## 44420          invasion     negative
## 44421              real     positive
## 44422              real        trust
## 44423            reason     positive
## 44424              grow anticipation
## 44425              grow          joy
## 44426              grow     positive
## 44427              grow        trust
## 44428              true          joy
## 44429              true     positive
## 44430              true        trust
## 44431           drought     negative
## 44432         resistant         fear
## 44433         resistant     negative
## 44434         efficient anticipation
## 44435         efficient     positive
## 44436         efficient        trust
## 44437           drought     negative
## 44438              risk anticipation
## 44439              risk         fear
## 44440              risk     negative
## 44441             major     positive
## 44442            manage     positive
## 44443            manage        trust
## 44444           drought     negative
## 44445          building     positive
## 44446              arid     negative
## 44447              arid      sadness
## 44448             major     positive
## 44449            manage     positive
## 44450            manage        trust
## 44451           drought     negative
## 44452          building     positive
## 44453             guess     surprise
## 44454           drought     negative
## 44455              flow     positive
## 44456              arid     negative
## 44457              arid      sadness
## 44458              lead     positive
## 44459          preserve     positive
## 44460              soil      disgust
## 44461              soil     negative
## 44462              soil      disgust
## 44463              soil     negative
## 44464              soil      disgust
## 44465              soil     negative
## 44466           drought     negative
## 44467           content          joy
## 44468           content     positive
## 44469           content        trust
## 44470             store anticipation
## 44471             store     positive
## 44472              lead     positive
## 44473          preserve     positive
## 44474              soil      disgust
## 44475              soil     negative
## 44476              soil      disgust
## 44477              soil     negative
## 44478              soil      disgust
## 44479              soil     negative
## 44480           drought     negative
## 44481           content          joy
## 44482           content     positive
## 44483           content        trust
## 44484             store anticipation
## 44485             store     positive
## 44486           passive     negative
## 44487            hollow     negative
## 44488            hollow      sadness
## 44489             leave     negative
## 44490             leave      sadness
## 44491             leave     surprise
## 44492             lower     negative
## 44493             lower      sadness
## 44494              flow     positive
## 44495              flow     positive
## 44496               hot        anger
## 44497              cold     negative
## 44498              flow     positive
## 44499          continue anticipation
## 44500          continue     positive
## 44501          continue        trust
## 44502              lost     negative
## 44503              lost      sadness
## 44504               hot        anger
## 44505              cold     negative
## 44506              soil      disgust
## 44507              soil     negative
## 44508      insufficient     negative
## 44509              talk     positive
## 44510              soil      disgust
## 44511              soil     negative
## 44512           organic     positive
## 44513           content          joy
## 44514           content     positive
## 44515           content        trust
## 44516           content          joy
## 44517           content     positive
## 44518           content        trust
## 44519         producing     positive
## 44520             sugar     positive
## 44521           ability     positive
## 44522              soil      disgust
## 44523              soil     negative
## 44524             store anticipation
## 44525             store     positive
## 44526             worth     positive
## 44527             start anticipation
## 44528            losing        anger
## 44529            losing     negative
## 44530            losing      sadness
## 44531      productivity     positive
## 44532           organic     positive
## 44533          increase     positive
## 44534              soil      disgust
## 44535              soil     negative
## 44536             depth     positive
## 44537             depth        trust
## 44538           organic     positive
## 44539             weigh anticipation
## 44540             weigh        trust
## 44541           organic     positive
## 44542        efficiency     positive
## 44543          increase     positive
## 44544           passive     negative
## 44545            hollow     negative
## 44546            hollow      sadness
## 44547             leave     negative
## 44548             leave      sadness
## 44549             leave     surprise
## 44550             lower     negative
## 44551             lower      sadness
## 44552              flow     positive
## 44553              flow     positive
## 44554             wrong     negative
## 44555              loss        anger
## 44556              loss         fear
## 44557              loss     negative
## 44558              loss      sadness
## 44559              soil      disgust
## 44560              soil     negative
## 44561        protecting     positive
## 44562        protecting        trust
## 44563              soil      disgust
## 44564              soil     negative
## 44565              soil      disgust
## 44566              soil     negative
## 44567              soil      disgust
## 44568              soil     negative
## 44569             sunny anticipation
## 44570             sunny          joy
## 44571             sunny     positive
## 44572             sunny     surprise
## 44573              soil      disgust
## 44574              soil     negative
## 44575      insufficient     negative
## 44576              talk     positive
## 44577              soil      disgust
## 44578              soil     negative
## 44579           organic     positive
## 44580           content          joy
## 44581           content     positive
## 44582           content        trust
## 44583           content          joy
## 44584           content     positive
## 44585           content        trust
## 44586         producing     positive
## 44587             sugar     positive
## 44588              lost     negative
## 44589              lost      sadness
## 44590              soil      disgust
## 44591              soil     negative
## 44592               top anticipation
## 44593               top     positive
## 44594               top        trust
## 44595              soil      disgust
## 44596              soil     negative
## 44597             sugar     positive
## 44598              soil      disgust
## 44599              soil     negative
## 44600              mess      disgust
## 44601              mess     negative
## 44602         community     positive
## 44603         oxidation     negative
## 44604              soil      disgust
## 44605              soil     negative
## 44606        efficiency     positive
## 44607           ability     positive
## 44608              soil      disgust
## 44609              soil     negative
## 44610             store anticipation
## 44611             store     positive
## 44612             worth     positive
## 44613             start anticipation
## 44614            losing        anger
## 44615            losing     negative
## 44616            losing      sadness
## 44617      productivity     positive
## 44618           organic     positive
## 44619          increase     positive
## 44620              soil      disgust
## 44621              soil     negative
## 44622             depth     positive
## 44623             depth        trust
## 44624           organic     positive
## 44625             weigh anticipation
## 44626             weigh        trust
## 44627           organic     positive
## 44628        efficiency     positive
## 44629          increase     positive
## 44630           organic     positive
## 44631              soil      disgust
## 44632              soil     negative
## 44633             build     positive
## 44634              soil      disgust
## 44635              soil     negative
## 44636              soil      disgust
## 44637              soil     negative
## 44638             sugar     positive
## 44639          bacteria      disgust
## 44640          bacteria         fear
## 44641          bacteria     negative
## 44642          bacteria      sadness
## 44643         neglected        anger
## 44644         neglected      disgust
## 44645         neglected     negative
## 44646         neglected      sadness
## 44647              soil      disgust
## 44648              soil     negative
## 44649              soil      disgust
## 44650              soil     negative
## 44651         breakdown     negative
## 44652              soil      disgust
## 44653              soil     negative
## 44654            supply     positive
## 44655              soil      disgust
## 44656              soil     negative
## 44657             build     positive
## 44658           compost      disgust
## 44659           compost     negative
## 44660           organic     positive
## 44661              soil      disgust
## 44662              soil     negative
## 44663        naturalist     positive
## 44664            actual     positive
## 44665           suggest        trust
## 44666     sequestration     negative
## 44667     sequestration      sadness
## 44668          continue anticipation
## 44669          continue     positive
## 44670          continue        trust
## 44671        discussion     positive
## 44672       agriculture     positive
## 44673              shit        anger
## 44674              shit      disgust
## 44675              shit     negative
## 44676          pressure     negative
## 44677            taught        trust
## 44678            theory anticipation
## 44679            theory        trust
## 44680          question     positive
## 44681              shit        anger
## 44682              shit      disgust
## 44683              shit     negative
## 44684             leave     negative
## 44685             leave      sadness
## 44686             leave     surprise
## 44687             start anticipation
## 44688           provide     positive
## 44689           provide        trust
## 44690             build     positive
## 44691              soil      disgust
## 44692              soil     negative
## 44693              soil      disgust
## 44694              soil     negative
## 44695              soil      disgust
## 44696              soil     negative
## 44697              soil      disgust
## 44698              soil     negative
## 44699       agriculture     positive
## 44700            remove        anger
## 44701            remove         fear
## 44702            remove     negative
## 44703            remove      sadness
## 44704              soil      disgust
## 44705              soil     negative
## 44706           physics     positive
## 44707            reason     positive
## 44708             inert     negative
## 44709              rock     positive
## 44710        productive     positive
## 44711       agriculture     positive
## 44712             found          joy
## 44713             found     positive
## 44714             found        trust
## 44715          contrary     negative
## 44716         retention     positive
## 44717       commonplace anticipation
## 44718       commonplace        trust
## 44719             vital     positive
## 44720             lower     negative
## 44721             lower      sadness
## 44722         intrusion         fear
## 44723         intrusion     negative
## 44724             coast     positive
## 44725       reliability     positive
## 44726       reliability        trust
## 44727            stable     positive
## 44728            stable        trust
## 44729          solution     positive
## 44730              farm anticipation
## 44731              tree        anger
## 44732              tree anticipation
## 44733              tree      disgust
## 44734              tree          joy
## 44735              tree     positive
## 44736              tree     surprise
## 44737              tree        trust
## 44738             break     surprise
## 44739           habitat     positive
## 44740         retention     positive
## 44741              farm anticipation
## 44742             study     positive
## 44743         resources          joy
## 44744         resources     positive
## 44745         resources        trust
## 44746              gain anticipation
## 44747              gain          joy
## 44748              gain     positive
## 44749         retention     positive
## 44750              soil      disgust
## 44751              soil     negative
## 44752             flood         fear
## 44753              kill         fear
## 44754              kill     negative
## 44755              kill      sadness
## 44756            excess     negative
## 44757               ban     negative
## 44758             lower     negative
## 44759             lower      sadness
## 44760           account        trust
## 44761          received     positive
## 44762               ban     negative
## 44763          question     positive
## 44764              time anticipation
## 44765           develop anticipation
## 44766           develop     positive
## 44767           develop anticipation
## 44768           develop     positive
## 44769             major     positive
## 44770               don     positive
## 44771               don        trust
## 44772        government         fear
## 44773        government     negative
## 44774            happen anticipation
## 44775           heavily     negative
## 44776             start anticipation
## 44777              time anticipation
## 44778           finally anticipation
## 44779           finally      disgust
## 44780           finally          joy
## 44781           finally     positive
## 44782           finally     surprise
## 44783           finally        trust
## 44784            giving     positive
## 44785      advantageous     positive
## 44786            escape anticipation
## 44787            escape         fear
## 44788            escape     negative
## 44789            escape     positive
## 44790             fight        anger
## 44791             fight         fear
## 44792             fight     negative
## 44793         blackmail        anger
## 44794         blackmail         fear
## 44795         blackmail     negative
## 44796           prevent         fear
## 44797           reading     positive
## 44798             prime     positive
## 44799             model     positive
## 44800         nightmare         fear
## 44801         nightmare     negative
## 44802    disinformation        anger
## 44803    disinformation         fear
## 44804    disinformation     negative
## 44805         professor     positive
## 44806         professor        trust
## 44807            growth     positive
## 44808           knowing     positive
## 44809         professor     positive
## 44810         professor        trust
## 44811             lying        anger
## 44812             lying      disgust
## 44813             lying     negative
## 44814        university anticipation
## 44815        university     positive
## 44816           economy        trust
## 44817           economy        trust
## 44818        prosperity     positive
## 44819             money        anger
## 44820             money anticipation
## 44821             money          joy
## 44822             money     positive
## 44823             money     surprise
## 44824             money        trust
## 44825           drought     negative
## 44826            marked     positive
## 44827             major     positive
## 44828            refuse     negative
## 44829           healthy     positive
## 44830         desirable     positive
## 44831               sue        anger
## 44832               sue     negative
## 44833               sue      sadness
## 44834            patent     positive
## 44835           winning anticipation
## 44836           winning      disgust
## 44837           winning          joy
## 44838           winning     positive
## 44839           winning      sadness
## 44840           winning     surprise
## 44841           winning        trust
## 44842              food          joy
## 44843              food     positive
## 44844              food        trust
## 44845          solution     positive
## 44846            change         fear
## 44847            change         fear
## 44848             wrong     negative
## 44849            honest        anger
## 44850            honest      disgust
## 44851            honest         fear
## 44852            honest          joy
## 44853            honest     positive
## 44854            honest      sadness
## 44855            honest        trust
## 44856             money        anger
## 44857             money anticipation
## 44858             money          joy
## 44859             money     positive
## 44860             money     surprise
## 44861             money        trust
## 44862             learn     positive
## 44863            actual     positive
## 44864            giving     positive
## 44865             money        anger
## 44866             money anticipation
## 44867             money          joy
## 44868             money     positive
## 44869             money     surprise
## 44870             money        trust
## 44871            reason     positive
## 44872          restrict     negative
## 44873          restrict      sadness
## 44874              shit        anger
## 44875              shit      disgust
## 44876              shit     negative
## 44877               pay anticipation
## 44878               pay          joy
## 44879               pay     positive
## 44880               pay        trust
## 44881            refuse     negative
## 44882        production anticipation
## 44883        production     positive
## 44884            refuse     negative
## 44885               eat     positive
## 44886            biased     negative
## 44887            biased     negative
## 44888          argument        anger
## 44889          argument     negative
## 44890           teacher     positive
## 44891           teacher        trust
## 44892             happy anticipation
## 44893             happy          joy
## 44894             happy     positive
## 44895             happy        trust
## 44896              deal anticipation
## 44897              deal          joy
## 44898              deal     positive
## 44899              deal     surprise
## 44900              deal        trust
## 44901             guess     surprise
## 44902           develop anticipation
## 44903           develop     positive
## 44904            biased     negative
## 44905          strength     positive
## 44906          strength        trust
## 44907            biased     negative
## 44908           excited anticipation
## 44909           excited          joy
## 44910           excited     positive
## 44911           excited     surprise
## 44912           excited        trust
## 44913              crap      disgust
## 44914              crap     negative
## 44915           excited anticipation
## 44916           excited          joy
## 44917           excited     positive
## 44918           excited     surprise
## 44919           excited        trust
## 44920             money        anger
## 44921             money anticipation
## 44922             money          joy
## 44923             money     positive
## 44924             money     surprise
## 44925             money        trust
## 44926         producing     positive
## 44927              time anticipation
## 44928          hospital         fear
## 44929          hospital      sadness
## 44930          hospital        trust
## 44931              fill        trust
## 44932             found          joy
## 44933             found     positive
## 44934             found        trust
## 44935            fairly     positive
## 44936            fairly        trust
## 44937             level     positive
## 44938             level        trust
## 44939       established          joy
## 44940       established     positive
## 44941          official        trust
## 44942             found          joy
## 44943             found     positive
## 44944             found        trust
## 44945            fairly     positive
## 44946            fairly        trust
## 44947             level     positive
## 44948             level        trust
## 44949       established          joy
## 44950       established     positive
## 44951 misrepresentation     negative
## 44952 misrepresentation      sadness
## 44953              main     positive
## 44954       agriculture     positive
## 44955            coming anticipation
## 44956        dependency     negative
## 44957        unexpected anticipation
## 44958        unexpected         fear
## 44959        unexpected          joy
## 44960        unexpected     negative
## 44961        unexpected     positive
## 44962        unexpected     surprise
## 44963              time anticipation
## 44964              lost     negative
## 44965              lost      sadness
## 44966              farm anticipation
## 44967            happen anticipation
## 44968              glow anticipation
## 44969              glow          joy
## 44970              glow     positive
## 44971              glow        trust
## 44972              dark      sadness
## 44973          powerful        anger
## 44974          powerful anticipation
## 44975          powerful      disgust
## 44976          powerful         fear
## 44977          powerful          joy
## 44978          powerful     positive
## 44979          powerful        trust
## 44980         dangerous         fear
## 44981         dangerous     negative
## 44982          relevant     positive
## 44983          relevant        trust
## 44984             found          joy
## 44985             found     positive
## 44986             found        trust
## 44987             found          joy
## 44988             found     positive
## 44989             found        trust
## 44990              food          joy
## 44991              food     positive
## 44992              food        trust
## 44993           tobacco     negative
## 44994               bad        anger
## 44995               bad      disgust
## 44996               bad         fear
## 44997               bad     negative
## 44998               bad      sadness
## 44999               eat     positive
## 45000             risky anticipation
## 45001             risky         fear
## 45002             risky     negative
## 45003             risky anticipation
## 45004             risky         fear
## 45005             risky     negative
## 45006              fear        anger
## 45007              fear         fear
## 45008              fear     negative
## 45009              fear        anger
## 45010              fear         fear
## 45011              fear     negative
## 45012            manual        trust
## 45013           precise     positive
## 45014               eat     positive
## 45015            cancer        anger
## 45016            cancer      disgust
## 45017            cancer         fear
## 45018            cancer     negative
## 45019            cancer      sadness
## 45020            faulty     negative
## 45021            change         fear
## 45022              food          joy
## 45023              food     positive
## 45024              food        trust
## 45025              safe          joy
## 45026              safe     positive
## 45027              safe        trust
## 45028         dangerous         fear
## 45029         dangerous     negative
## 45030               eat     positive
## 45031             offer     positive
## 45032          scrutiny     negative
## 45033               eat     positive
## 45034         dangerous         fear
## 45035         dangerous     negative
## 45036        decomposed      sadness
## 45037           stomach      disgust
## 45038          building     positive
## 45039         dangerous         fear
## 45040         dangerous     negative
## 45041      instructions anticipation
## 45042      instructions        trust
## 45043             sense     positive
## 45044              hope anticipation
## 45045              hope          joy
## 45046              hope     positive
## 45047              hope     surprise
## 45048              hope        trust
## 45049             agree     positive
## 45050           stomach      disgust
## 45051              food          joy
## 45052              food     positive
## 45053              food        trust
## 45054          building     positive
## 45055              food          joy
## 45056              food     positive
## 45057              food        trust
## 45058        decomposed      sadness
## 45059              harm         fear
## 45060              harm     negative
## 45061          building     positive
## 45062              hope anticipation
## 45063              hope          joy
## 45064              hope     positive
## 45065              hope     surprise
## 45066              hope        trust
## 45067            happen anticipation
## 45068             money        anger
## 45069             money anticipation
## 45070             money          joy
## 45071             money     positive
## 45072             money     surprise
## 45073             money        trust
## 45074             legal     positive
## 45075             legal        trust
## 45076               law        trust
## 45077             cross        anger
## 45078             cross         fear
## 45079             cross     negative
## 45080             cross      sadness
## 45081              food          joy
## 45082              food     positive
## 45083              food        trust
## 45084            change         fear
## 45085            modify     surprise
## 45086            change         fear
## 45087            modify     surprise
## 45088            cancer        anger
## 45089            cancer      disgust
## 45090            cancer         fear
## 45091            cancer     negative
## 45092            cancer      sadness
## 45093            faulty     negative
## 45094           explain     positive
## 45095           explain        trust
## 45096             break     surprise
## 45097           improve anticipation
## 45098           improve          joy
## 45099           improve     positive
## 45100           improve        trust
## 45101             break     surprise
## 45102             avoid         fear
## 45103             avoid     negative
## 45104               bad        anger
## 45105               bad      disgust
## 45106               bad         fear
## 45107               bad     negative
## 45108               bad      sadness
## 45109              lost     negative
## 45110              lost      sadness
## 45111           account        trust
## 45112          gullible     negative
## 45113          gullible      sadness
## 45114          gullible        trust
## 45115         community     positive
## 45116       information     positive
## 45117             error     negative
## 45118             error      sadness
## 45119              main     positive
## 45120        opposition        anger
## 45121        opposition     negative
## 45122              food          joy
## 45123              food     positive
## 45124              food        trust
## 45125         plentiful     positive
## 45126            afford     positive
## 45127           healthy     positive
## 45128           healthy     positive
## 45129              food          joy
## 45130              food     positive
## 45131              food        trust
## 45132           healthy     positive
## 45133              grow anticipation
## 45134              grow          joy
## 45135              grow     positive
## 45136              grow        trust
## 45137           healthy     positive
## 45138         unhealthy      disgust
## 45139         unhealthy         fear
## 45140         unhealthy     negative
## 45141         unhealthy      sadness
## 45142          restrict     negative
## 45143          restrict      sadness
## 45144          question     positive
## 45145            coming anticipation
## 45146            coming anticipation
## 45147        discussion     positive
## 45148           provide     positive
## 45149           provide        trust
## 45150             lower     negative
## 45151             lower      sadness
## 45152         dangerous         fear
## 45153         dangerous     negative
## 45154             wrong     negative
## 45155              soil      disgust
## 45156              soil     negative
## 45157         dangerous         fear
## 45158         dangerous     negative
## 45159              food          joy
## 45160              food     positive
## 45161              food        trust
## 45162              shit        anger
## 45163              shit      disgust
## 45164              shit     negative
## 45165            stupid     negative
## 45166      considerable     positive
## 45167              time anticipation
## 45168               bad        anger
## 45169               bad      disgust
## 45170               bad         fear
## 45171               bad     negative
## 45172               bad      sadness
## 45173            excuse     negative
## 45174              food          joy
## 45175              food     positive
## 45176              food        trust
## 45177             crazy        anger
## 45178             crazy         fear
## 45179             crazy     negative
## 45180             crazy      sadness
## 45181     unsustainable     negative
## 45182     unsustainable     negative
## 45183              damn        anger
## 45184              damn      disgust
## 45185              damn     negative
## 45186              time anticipation
## 45187              real     positive
## 45188              real        trust
## 45189             avoid         fear
## 45190             avoid     negative
## 45191            change         fear
## 45192            excuse     negative
## 45193          argument        anger
## 45194          argument     negative
## 45195           vaccine     positive
## 45196            action     positive
## 45197        scientific     positive
## 45198        scientific        trust
## 45199        scientific     positive
## 45200        scientific        trust
## 45201             lower     negative
## 45202             lower      sadness
## 45203             lower     negative
## 45204             lower      sadness
## 45205        impossible     negative
## 45206        impossible      sadness
## 45207            afford     positive
## 45208               bad        anger
## 45209               bad      disgust
## 45210               bad         fear
## 45211               bad     negative
## 45212               bad      sadness
## 45213              main     positive
## 45214              hate        anger
## 45215              hate      disgust
## 45216              hate         fear
## 45217              hate     negative
## 45218              hate      sadness
## 45219            change         fear
## 45220        impervious     positive
## 45221              fire         fear
## 45222           perfect anticipation
## 45223           perfect          joy
## 45224           perfect     positive
## 45225           perfect        trust
## 45226          horrible        anger
## 45227          horrible      disgust
## 45228          horrible         fear
## 45229          horrible     negative
## 45230            stupid     negative
## 45231            rocket        anger
## 45232            league     positive
## 45233             start anticipation
## 45234            damage        anger
## 45235            damage      disgust
## 45236            damage     negative
## 45237            damage      sadness
## 45238               bad        anger
## 45239               bad      disgust
## 45240               bad         fear
## 45241               bad     negative
## 45242               bad      sadness
## 45243            prison        anger
## 45244            prison         fear
## 45245            prison     negative
## 45246            prison      sadness
## 45247             trust        trust
## 45248         affection          joy
## 45249         affection     positive
## 45250         affection        trust
## 45251               mad        anger
## 45252               mad      disgust
## 45253               mad         fear
## 45254               mad     negative
## 45255               mad      sadness
## 45256              true          joy
## 45257              true     positive
## 45258              true        trust
## 45259           brother     positive
## 45260           brother        trust
## 45261              time anticipation
## 45262           knowing     positive
## 45263           equally     positive
## 45264              dumb     negative
## 45265               ass     negative
## 45266          criminal        anger
## 45267          criminal      disgust
## 45268          criminal         fear
## 45269          criminal     negative
## 45270           mocking        anger
## 45271           mocking      disgust
## 45272           mocking     negative
## 45273           mocking      sadness
## 45274            pretty anticipation
## 45275            pretty          joy
## 45276            pretty     positive
## 45277            pretty        trust
## 45278         attention     positive
## 45279               sex anticipation
## 45280               sex          joy
## 45281               sex     positive
## 45282               sex        trust
## 45283          offender        anger
## 45284          offender      disgust
## 45285          offender         fear
## 45286          offender     negative
## 45287          offender      sadness
## 45288       intelligent     positive
## 45289       intelligent        trust
## 45290          politics        anger
## 45291           heavily     negative
## 45292           corrupt     negative
## 45293       intelligent     positive
## 45294       intelligent        trust
## 45295           justice     positive
## 45296           justice        trust
## 45297            system        trust
## 45298            fairly     positive
## 45299            fairly        trust
## 45300            actual     positive
## 45301               bad        anger
## 45302               bad      disgust
## 45303               bad         fear
## 45304               bad     negative
## 45305               bad      sadness
## 45306             calls anticipation
## 45307             calls     negative
## 45308             calls        trust
## 45309            stupid     negative
## 45310             worse         fear
## 45311             worse     negative
## 45312             worse      sadness
## 45313             worse         fear
## 45314             worse     negative
## 45315             worse      sadness
## 45316           corrupt     negative
## 45317          disagree        anger
## 45318          disagree     negative
## 45319       exaggerated     negative
## 45320        impression     positive
## 45321          laughing          joy
## 45322          laughing     positive
## 45323               ass     negative
## 45324           mocking        anger
## 45325           mocking      disgust
## 45326           mocking     negative
## 45327           mocking      sadness
## 45328              king     positive
## 45329             bitch        anger
## 45330             bitch      disgust
## 45331             bitch         fear
## 45332             bitch     negative
## 45333             bitch      sadness
## 45334              hate        anger
## 45335              hate      disgust
## 45336              hate         fear
## 45337              hate     negative
## 45338              hate      sadness
## 45339          intended anticipation
## 45340          intended     positive
## 45341               don     positive
## 45342               don        trust
## 45343             agree     positive
## 45344            insane        anger
## 45345            insane         fear
## 45346            insane     negative
## 45347               die         fear
## 45348               die     negative
## 45349               die      sadness
## 45350            pretty anticipation
## 45351            pretty          joy
## 45352            pretty     positive
## 45353            pretty        trust
## 45354            prison        anger
## 45355            prison         fear
## 45356            prison     negative
## 45357            prison      sadness
## 45358             start anticipation
## 45359              dirt      disgust
## 45360              dirt     negative
## 45361         attention     positive
## 45362           mocking        anger
## 45363           mocking      disgust
## 45364           mocking     negative
## 45365           mocking      sadness
## 45366              holy     positive
## 45367              shit        anger
## 45368              shit      disgust
## 45369              shit     negative
## 45370              dumb     negative
## 45371        defamation      disgust
## 45372        defamation         fear
## 45373        defamation     negative
## 45374           account        trust
## 45375              real     positive
## 45376              real        trust
## 45377              hero anticipation
## 45378              hero          joy
## 45379              hero     positive
## 45380              hero     surprise
## 45381              hero        trust
## 45382           mockery      disgust
## 45383           mockery     negative
## 45384              damn        anger
## 45385              damn      disgust
## 45386              damn     negative
## 45387            prison        anger
## 45388            prison         fear
## 45389            prison     negative
## 45390            prison      sadness
## 45391              time anticipation
## 45392           screwed        anger
## 45393           screwed     negative
## 45394          dementia         fear
## 45395          dementia     negative
## 45396          dementia      sadness
## 45397     schizophrenia        anger
## 45398     schizophrenia      disgust
## 45399     schizophrenia         fear
## 45400     schizophrenia     negative
## 45401     schizophrenia      sadness
## 45402          question     positive
## 45403             bigot        anger
## 45404             bigot      disgust
## 45405             bigot         fear
## 45406             bigot     negative
## 45407          disgrace        anger
## 45408          disgrace      disgust
## 45409          disgrace     negative
## 45410          disgrace      sadness
## 45411               hit        anger
## 45412               hit     negative
## 45413             bigot        anger
## 45414             bigot      disgust
## 45415             bigot         fear
## 45416             bigot     negative
## 45417              joke     negative
## 45418        vocabulary     positive
## 45419            coming anticipation
## 45420             bigot        anger
## 45421             bigot      disgust
## 45422             bigot         fear
## 45423             bigot     negative
## 45424          ignorant      disgust
## 45425          ignorant     negative
## 45426          ignorant      disgust
## 45427          ignorant     negative
## 45428            coming anticipation
## 45429              hate        anger
## 45430              hate      disgust
## 45431              hate         fear
## 45432              hate     negative
## 45433              hate      sadness
## 45434              rest     positive
## 45435            stupid     negative
## 45436         resources          joy
## 45437         resources     positive
## 45438         resources        trust
## 45439             learn     positive
## 45440               don     positive
## 45441               don        trust
## 45442             sense     positive
## 45443        ridiculous        anger
## 45444        ridiculous      disgust
## 45445        ridiculous     negative
## 45446               ill        anger
## 45447               ill      disgust
## 45448               ill         fear
## 45449               ill     negative
## 45450               ill      sadness
## 45451             fight        anger
## 45452             fight         fear
## 45453             fight     negative
## 45454           neutral anticipation
## 45455           neutral        trust
## 45456            actual     positive
## 45457           logical     positive
## 45458            reason     positive
## 45459          advocate        trust
## 45460             bigot        anger
## 45461             bigot      disgust
## 45462             bigot         fear
## 45463             bigot     negative
## 45464             bigot        anger
## 45465             bigot      disgust
## 45466             bigot         fear
## 45467             bigot     negative
## 45468            prefer     positive
## 45469            prefer        trust
## 45470               don     positive
## 45471               don        trust
## 45472             bigot        anger
## 45473             bigot      disgust
## 45474             bigot         fear
## 45475             bigot     negative
## 45476            ignore     negative
## 45477            ignore     negative
## 45478             money        anger
## 45479             money anticipation
## 45480             money          joy
## 45481             money     positive
## 45482             money     surprise
## 45483             money        trust
## 45484             bigot        anger
## 45485             bigot      disgust
## 45486             bigot         fear
## 45487             bigot     negative
## 45488               mad        anger
## 45489               mad      disgust
## 45490               mad         fear
## 45491               mad     negative
## 45492               mad      sadness
## 45493          humorous          joy
## 45494          humorous     positive
## 45495           sincere     positive
## 45496           sincere        trust
## 45497               fun anticipation
## 45498               fun          joy
## 45499               fun     positive
## 45500            pretty anticipation
## 45501            pretty          joy
## 45502            pretty     positive
## 45503            pretty        trust
## 45504              joke     negative
## 45505           mocking        anger
## 45506           mocking      disgust
## 45507           mocking     negative
## 45508           mocking      sadness
## 45509           mocking        anger
## 45510           mocking      disgust
## 45511           mocking     negative
## 45512           mocking      sadness
## 45513             agree     positive
## 45514      embarrassing     negative
## 45515      embarrassing     negative
## 45516      embarrassing     negative
## 45517            cringe      disgust
## 45518            cringe         fear
## 45519            cringe     negative
## 45520            cringe      sadness
## 45521            joking     positive
## 45522            stupid     negative
## 45523               god anticipation
## 45524               god         fear
## 45525               god          joy
## 45526               god     positive
## 45527               god        trust
## 45528           falling     negative
## 45529           falling      sadness
## 45530              weep     negative
## 45531              weep      sadness
## 45532              real     positive
## 45533              real        trust
## 45534             doubt         fear
## 45535             doubt     negative
## 45536             doubt      sadness
## 45537             doubt        trust
## 45538              fake     negative
## 45539            pretty anticipation
## 45540            pretty          joy
## 45541            pretty     positive
## 45542            pretty        trust
## 45543              fake     negative
## 45544            purely     positive
## 45545            purely        trust
## 45546           mocking        anger
## 45547           mocking      disgust
## 45548           mocking     negative
## 45549           mocking      sadness
## 45550           brother     positive
## 45551           brother        trust
## 45552              joke     negative
## 45553               cap anticipation
## 45554               cap        trust
## 45555            insane        anger
## 45556            insane         fear
## 45557            insane     negative
## 45558           asshole        anger
## 45559           asshole      disgust
## 45560           asshole     negative
## 45561             idiot      disgust
## 45562             idiot     negative
## 45563            pretty anticipation
## 45564            pretty          joy
## 45565            pretty     positive
## 45566            pretty        trust
## 45567             sense     positive
## 45568              joke     negative
## 45569              joke     negative
## 45570         supporter          joy
## 45571         supporter     positive
## 45572         supporter        trust
## 45573            joking     positive
## 45574              joke     negative
## 45575              damn        anger
## 45576              damn      disgust
## 45577              damn     negative
## 45578             happy anticipation
## 45579             happy          joy
## 45580             happy     positive
## 45581             happy        trust
## 45582             lucky          joy
## 45583             lucky     positive
## 45584             lucky     surprise
## 45585               fun anticipation
## 45586               fun          joy
## 45587               fun     positive
## 45588              time anticipation
## 45589             shame      disgust
## 45590             shame         fear
## 45591             shame     negative
## 45592             shame      sadness
## 45593         isolation     negative
## 45594         isolation      sadness
## 45595           freedom          joy
## 45596           freedom     positive
## 45597           freedom        trust
## 45598              wild     negative
## 45599              wild     surprise
## 45600            friend          joy
## 45601            friend     positive
## 45602            friend        trust
## 45603              lost     negative
## 45604              lost      sadness
## 45605              cool     positive
## 45606           subject     negative
## 45607      civilization     positive
## 45608      civilization        trust
## 45609           ability     positive
## 45610       entertained          joy
## 45611       entertained     positive
## 45612              shit        anger
## 45613              shit      disgust
## 45614              shit     negative
## 45615               bee        anger
## 45616               bee         fear
## 45617             buddy anticipation
## 45618             buddy          joy
## 45619             buddy     positive
## 45620             buddy        trust
## 45621              cool     positive
## 45622               job     positive
## 45623              time anticipation
## 45624               ace     positive
## 45625          tiresome     negative
## 45626              time anticipation
## 45627              time anticipation
## 45628           feeling        anger
## 45629           feeling anticipation
## 45630           feeling      disgust
## 45631           feeling         fear
## 45632           feeling          joy
## 45633           feeling     negative
## 45634           feeling     positive
## 45635           feeling      sadness
## 45636           feeling     surprise
## 45637           feeling        trust
## 45638         curiosity anticipation
## 45639         curiosity     positive
## 45640         curiosity     surprise
## 45641            malice        anger
## 45642            malice         fear
## 45643            malice     negative
## 45644               fun anticipation
## 45645               fun          joy
## 45646               fun     positive
## 45647           explain     positive
## 45648           explain        trust
## 45649             learn     positive
## 45650            forget     negative
## 45651               bee        anger
## 45652               bee         fear
## 45653              dark      sadness
## 45654          relative        trust
## 45655          cracking     negative
## 45656            insult        anger
## 45657            insult      disgust
## 45658            insult     negative
## 45659            insult      sadness
## 45660            insult     surprise
## 45661        compliment anticipation
## 45662        compliment          joy
## 45663        compliment     positive
## 45664        compliment     surprise
## 45665        compliment        trust
## 45666              mate     positive
## 45667              mate        trust
## 45668            insult        anger
## 45669            insult      disgust
## 45670            insult     negative
## 45671            insult      sadness
## 45672            insult     surprise
## 45673              time anticipation
## 45674             kudos          joy
## 45675             kudos     positive
## 45676              jest          joy
## 45677              jest     positive
## 45678              jest     surprise
## 45679              love          joy
## 45680              love     positive
## 45681              love          joy
## 45682              love     positive
## 45683             guess     surprise
## 45684          creative     positive
## 45685            coming anticipation
## 45686            joking     positive
## 45687           blessed          joy
## 45688           blessed     positive
## 45689           happily          joy
## 45690           happily     positive
## 45691       grandfather        trust
## 45692             saint anticipation
## 45693             saint          joy
## 45694             saint     positive
## 45695             saint     surprise
## 45696             saint        trust
## 45697            modest     positive
## 45698            modest        trust
## 45699            loving          joy
## 45700            loving     positive
## 45701            loving        trust
## 45702             pride          joy
## 45703             pride     positive
## 45704          daughter          joy
## 45705          daughter     positive
## 45706              yell        anger
## 45707              yell         fear
## 45708              yell     negative
## 45709              yell     surprise
## 45710             swear     positive
## 45711             swear        trust
## 45712             broke         fear
## 45713             broke     negative
## 45714             broke      sadness
## 45715             fixed        trust
## 45716              love          joy
## 45717              love     positive
## 45718             saint anticipation
## 45719             saint          joy
## 45720             saint     positive
## 45721             saint     surprise
## 45722             saint        trust
## 45723       grandfather        trust
## 45724              time anticipation
## 45725             spent     negative
## 45726             lines         fear
## 45727             crazy        anger
## 45728             crazy         fear
## 45729             crazy     negative
## 45730             crazy      sadness
## 45731         wholesome     positive
## 45732         wholesome        trust
## 45733              time anticipation
## 45734            reason     positive
## 45735          terrible        anger
## 45736          terrible      disgust
## 45737          terrible         fear
## 45738          terrible     negative
## 45739          terrible      sadness
## 45740            hooked     negative
## 45741            insane        anger
## 45742            insane         fear
## 45743            insane     negative
## 45744               hit        anger
## 45745               hit     negative
## 45746              flow     positive
## 45747             music          joy
## 45748             music     positive
## 45749             music      sadness
## 45750               don     positive
## 45751               don        trust
## 45752              hurt        anger
## 45753              hurt         fear
## 45754              hurt     negative
## 45755              hurt      sadness
## 45756              real     positive
## 45757              real        trust
## 45758              shit        anger
## 45759              shit      disgust
## 45760              shit     negative
## 45761             guess     surprise
## 45762              flow     positive
## 45763           naughty     negative
## 45764             catch     surprise
## 45765              yell        anger
## 45766              yell         fear
## 45767              yell     negative
## 45768              yell     surprise
## 45769             learn     positive
## 45770              swim anticipation
## 45771              swim         fear
## 45772              swim          joy
## 45773              swim     positive
## 45774            escape anticipation
## 45775            escape         fear
## 45776            escape     negative
## 45777            escape     positive
## 45778             worry anticipation
## 45779             worry         fear
## 45780             worry     negative
## 45781             worry      sadness
## 45782              time anticipation
## 45783            stress     negative
## 45784              time anticipation
## 45785             catch     surprise
## 45786     uncomfortable     negative
## 45787               don     positive
## 45788               don        trust
## 45789              real     positive
## 45790              real        trust
## 45791            decent     positive
## 45792            honest        anger
## 45793            honest      disgust
## 45794            honest         fear
## 45795            honest          joy
## 45796            honest     positive
## 45797            honest      sadness
## 45798            honest        trust
## 45799             start anticipation
## 45800            grumpy        anger
## 45801            grumpy      disgust
## 45802            grumpy     negative
## 45803            grumpy      sadness
## 45804            slayer        anger
## 45805            slayer      disgust
## 45806            slayer         fear
## 45807            slayer     negative
## 45808            slayer      sadness
## 45809            slayer     surprise
## 45810              john      disgust
## 45811              john     negative
## 45812             anger        anger
## 45813             anger     negative
## 45814            forget     negative
## 45815              amen          joy
## 45816              amen     positive
## 45817              amen        trust
## 45818            fellow     positive
## 45819            fellow        trust
## 45820           brother     positive
## 45821           brother        trust
## 45822              word     positive
## 45823              word        trust
## 45824              word     positive
## 45825              word        trust
## 45826               fun anticipation
## 45827               fun          joy
## 45828               fun     positive
## 45829              time anticipation
## 45830            friend          joy
## 45831            friend     positive
## 45832            friend        trust
## 45833              pick     positive
## 45834           garbage      disgust
## 45835           garbage     negative
## 45836          planning anticipation
## 45837          planning     positive
## 45838          planning        trust
## 45839          terrible        anger
## 45840          terrible      disgust
## 45841          terrible         fear
## 45842          terrible     negative
## 45843          terrible      sadness
## 45844             catch     surprise
## 45845              coax        trust
## 45846              bait         fear
## 45847              bait     negative
## 45848              bait        trust
## 45849               don     positive
## 45850               don        trust
## 45851             dirty      disgust
## 45852             dirty     negative
## 45853              shit        anger
## 45854              shit      disgust
## 45855              shit     negative
## 45856              shit        anger
## 45857              shit      disgust
## 45858              shit     negative
## 45859            damned     negative
## 45860               job     positive
## 45861              love          joy
## 45862              love     positive
## 45863               eat     positive
## 45864              time anticipation
## 45865              lure     negative
## 45866           spoiler     negative
## 45867           spoiler      sadness
## 45868              bite     negative
## 45869         expecting anticipation
## 45870          fighting        anger
## 45871          fighting     negative
## 45872              bear        anger
## 45873              bear         fear
## 45874               fun anticipation
## 45875               fun          joy
## 45876               fun     positive
## 45877            mutter        anger
## 45878            mutter     negative
## 45879              bait         fear
## 45880              bait     negative
## 45881              bait        trust
## 45882             trash      disgust
## 45883             trash     negative
## 45884             trash      sadness
## 45885           hurting        anger
## 45886           hurting         fear
## 45887           hurting     negative
## 45888           hurting      sadness
## 45889               fun anticipation
## 45890               fun          joy
## 45891               fun     positive
## 45892             watch anticipation
## 45893             watch         fear
## 45894            forget     negative
## 45895              hate        anger
## 45896              hate      disgust
## 45897              hate         fear
## 45898              hate     negative
## 45899              hate      sadness
## 45900            stupid     negative
## 45901              time anticipation
## 45902              bait         fear
## 45903              bait     negative
## 45904              bait        trust
## 45905          shooting        anger
## 45906          shooting         fear
## 45907          shooting     negative
## 45908            public anticipation
## 45909            public     positive
## 45910              kill         fear
## 45911              kill     negative
## 45912              kill      sadness
## 45913            reason     positive
## 45914              true          joy
## 45915              true     positive
## 45916              true        trust
## 45917              real     positive
## 45918              real        trust
## 45919      disconnected     negative
## 45920      disconnected      sadness
## 45921          enjoying anticipation
## 45922          enjoying          joy
## 45923          enjoying     positive
## 45924          enjoying        trust
## 45925          engaging          joy
## 45926          engaging     positive
## 45927          engaging        trust
## 45928              love          joy
## 45929              love     positive
## 45930              damn        anger
## 45931              damn      disgust
## 45932              damn     negative
## 45933              time anticipation
## 45934              shit        anger
## 45935              shit      disgust
## 45936              shit     negative
## 45937           pretend     negative
## 45938              talk     positive
## 45939            actual     positive
## 45940               eat     positive
## 45941              swim anticipation
## 45942              swim         fear
## 45943              swim          joy
## 45944              swim     positive
## 45945          romantic anticipation
## 45946          romantic          joy
## 45947          romantic     positive
## 45948          romantic        trust
## 45949             dirty      disgust
## 45950             dirty     negative
## 45951            mother anticipation
## 45952            mother          joy
## 45953            mother     negative
## 45954            mother     positive
## 45955            mother      sadness
## 45956            mother        trust
## 45957             whore      disgust
## 45958             whore     negative
## 45959             sweet anticipation
## 45960             sweet          joy
## 45961             sweet     positive
## 45962             sweet     surprise
## 45963             sweet        trust
## 45964              baby          joy
## 45965              baby     positive
## 45966             bitch        anger
## 45967             bitch      disgust
## 45968             bitch         fear
## 45969             bitch     negative
## 45970             bitch      sadness
## 45971             haven     positive
## 45972             haven        trust
## 45973              word     positive
## 45974              word        trust
## 45975              talk     positive
## 45976              yell        anger
## 45977              yell         fear
## 45978              yell     negative
## 45979              yell     surprise
## 45980              sing anticipation
## 45981              sing          joy
## 45982              sing     positive
## 45983              sing      sadness
## 45984              sing        trust
## 45985              true          joy
## 45986              true     positive
## 45987              true        trust
## 45988               pay anticipation
## 45989               pay          joy
## 45990               pay     positive
## 45991               pay        trust
## 45992               don     positive
## 45993               don        trust
## 45994             watch anticipation
## 45995             watch         fear
## 45996              shit        anger
## 45997              shit      disgust
## 45998              shit     negative
## 45999             weird      disgust
## 46000             weird     negative
## 46001              shit        anger
## 46002              shit      disgust
## 46003              shit     negative
## 46004          deranged        anger
## 46005          deranged      disgust
## 46006          deranged         fear
## 46007          deranged     negative
## 46008            garden          joy
## 46009            garden     positive
## 46010      professional     positive
## 46011      professional        trust
## 46012             mouth     surprise
## 46013              bank        trust
## 46014             patch     negative
## 46015             badly     negative
## 46016             badly      sadness
## 46017              tree        anger
## 46018              tree anticipation
## 46019              tree      disgust
## 46020              tree          joy
## 46021              tree     positive
## 46022              tree     surprise
## 46023              tree        trust
## 46024              tree        anger
## 46025              tree anticipation
## 46026              tree      disgust
## 46027              tree          joy
## 46028              tree     positive
## 46029              tree     surprise
## 46030              tree        trust
## 46031           explain     positive
## 46032           explain        trust
## 46033              hell        anger
## 46034              hell      disgust
## 46035              hell         fear
## 46036              hell     negative
## 46037              hell      sadness
## 46038      questionable      disgust
## 46039      questionable     negative
## 46040               ass     negative
## 46041              rock     positive
## 46042              love          joy
## 46043              love     positive
## 46044        persistent     positive
## 46045              rock     positive
## 46046               sun anticipation
## 46047               sun          joy
## 46048               sun     positive
## 46049               sun     surprise
## 46050               sun        trust
## 46051          argument        anger
## 46052          argument     negative
## 46053            coming anticipation
## 46054            quaint          joy
## 46055            quaint     positive
## 46056            quaint        trust
## 46057             enjoy anticipation
## 46058             enjoy          joy
## 46059             enjoy     positive
## 46060             enjoy        trust
## 46061         interrupt        anger
## 46062         interrupt     negative
## 46063         interrupt     surprise
## 46064              sing anticipation
## 46065              sing          joy
## 46066              sing     positive
## 46067              sing      sadness
## 46068              sing        trust
## 46069              time anticipation
## 46070              wild     negative
## 46071              wild     surprise
## 46072              shit        anger
## 46073              shit      disgust
## 46074              shit     negative
## 46075              dumb     negative
## 46076              shit        anger
## 46077              shit      disgust
## 46078              shit     negative
## 46079               fun anticipation
## 46080               fun          joy
## 46081               fun     positive
## 46082           reading     positive
## 46083             smile          joy
## 46084             smile     positive
## 46085             smile     surprise
## 46086             smile        trust
## 46087            pretty anticipation
## 46088            pretty          joy
## 46089            pretty     positive
## 46090            pretty        trust
## 46091              shit        anger
## 46092              shit      disgust
## 46093              shit     negative
## 46094              time anticipation
## 46095              talk     positive
## 46096          favorite          joy
## 46097          favorite     positive
## 46098          favorite        trust
## 46099         perverted      disgust
## 46100         perverted     negative
## 46101              sing anticipation
## 46102              sing          joy
## 46103              sing     positive
## 46104              sing      sadness
## 46105              sing        trust
## 46106              sing anticipation
## 46107              sing          joy
## 46108              sing     positive
## 46109              sing      sadness
## 46110              sing        trust
## 46111              time anticipation
## 46112           happily          joy
## 46113           happily     positive
## 46114           pervert        anger
## 46115           pervert      disgust
## 46116           pervert     negative
## 46117           unaware     negative
## 46118             weird      disgust
## 46119             weird     negative
## 46120             watch anticipation
## 46121             watch         fear
## 46122         hilarious          joy
## 46123         hilarious     positive
## 46124         hilarious     surprise
## 46125              time anticipation
## 46126              wild     negative
## 46127              wild     surprise
## 46128             crazy        anger
## 46129             crazy         fear
## 46130             crazy     negative
## 46131             crazy      sadness
## 46132             smile          joy
## 46133             smile     positive
## 46134             smile     surprise
## 46135             smile        trust
## 46136               fun anticipation
## 46137               fun          joy
## 46138               fun     positive
## 46139              time anticipation
## 46140            grumpy        anger
## 46141            grumpy      disgust
## 46142            grumpy     negative
## 46143            grumpy      sadness
## 46144               hot        anger
## 46145             enjoy anticipation
## 46146             enjoy          joy
## 46147             enjoy     positive
## 46148             enjoy        trust
## 46149               fun anticipation
## 46150               fun          joy
## 46151               fun     positive
## 46152           reading     positive
## 46153     communication        trust
## 46154              talk     positive
## 46155              lose        anger
## 46156              lose      disgust
## 46157              lose         fear
## 46158              lose     negative
## 46159              lose      sadness
## 46160              lose     surprise
## 46161         arguments        anger
## 46162            famous     positive
## 46163             shove        anger
## 46164             shove     negative
## 46165             ready anticipation
## 46166              talk     positive
## 46167             music          joy
## 46168             music     positive
## 46169             music      sadness
## 46170          favorite          joy
## 46171          favorite     positive
## 46172          favorite        trust
## 46173         expecting anticipation
## 46174             enjoy anticipation
## 46175             enjoy          joy
## 46176             enjoy     positive
## 46177             enjoy        trust
## 46178              love          joy
## 46179              love     positive
## 46180              time anticipation
## 46181              time anticipation
## 46182          enjoying anticipation
## 46183          enjoying          joy
## 46184          enjoying     positive
## 46185          enjoying        trust
## 46186             catch     surprise
## 46187           impress     positive
## 46188              kill         fear
## 46189              kill     negative
## 46190              kill      sadness
## 46191             dying        anger
## 46192             dying      disgust
## 46193             dying         fear
## 46194             dying     negative
## 46195             dying      sadness
## 46196          laughing          joy
## 46197          laughing     positive
## 46198             watch anticipation
## 46199             watch         fear
## 46200              swim anticipation
## 46201              swim         fear
## 46202              swim          joy
## 46203              swim     positive
## 46204             dirty      disgust
## 46205             dirty     negative
## 46206             tease        anger
## 46207             tease anticipation
## 46208             tease     negative
## 46209             tease      sadness
## 46210         hilarious          joy
## 46211         hilarious     positive
## 46212         hilarious     surprise
## 46213           asshole        anger
## 46214           asshole      disgust
## 46215           asshole     negative
## 46216              kill         fear
## 46217              kill     negative
## 46218              kill      sadness
## 46219              damn        anger
## 46220              damn      disgust
## 46221              damn     negative
## 46222               hot        anger
## 46223              cool     positive
## 46224              talk     positive
## 46225           brother     positive
## 46226           brother        trust
## 46227             catch     surprise
## 46228            murder        anger
## 46229            murder      disgust
## 46230            murder         fear
## 46231            murder     negative
## 46232            murder      sadness
## 46233            murder     surprise
## 46234       responsible     positive
## 46235       responsible        trust
## 46236        diminished     negative
## 46237        population     positive
## 46238            tackle        anger
## 46239            tackle     surprise
## 46240             happy anticipation
## 46241             happy          joy
## 46242             happy     positive
## 46243             happy        trust
## 46244            coming anticipation
## 46245       information     positive
## 46246               eat     positive
## 46247              quit     negative
## 46248             peace anticipation
## 46249             peace          joy
## 46250             peace     positive
## 46251             peace        trust
## 46252             buddy anticipation
## 46253             buddy          joy
## 46254             buddy     positive
## 46255             buddy        trust
## 46256             laugh          joy
## 46257             laugh     positive
## 46258             laugh     surprise
## 46259           healthy     positive
## 46260              shit        anger
## 46261              shit      disgust
## 46262              shit     negative
## 46263             crazy        anger
## 46264             crazy         fear
## 46265             crazy     negative
## 46266             crazy      sadness
## 46267             child anticipation
## 46268             child          joy
## 46269             child     positive
## 46270             alive anticipation
## 46271             alive          joy
## 46272             alive     positive
## 46273             alive        trust
## 46274              talk     positive
## 46275      entertaining anticipation
## 46276      entertaining          joy
## 46277      entertaining     positive
## 46278              talk     positive
## 46279              talk     positive
## 46280              fair     positive
## 46281              fair     positive
## 46282              time anticipation
## 46283              time anticipation
## 46284             beach          joy
## 46285             enjoy anticipation
## 46286             enjoy          joy
## 46287             enjoy     positive
## 46288             enjoy        trust
## 46289         isolation     negative
## 46290         isolation      sadness
## 46291              time anticipation
## 46292              dumb     negative
## 46293              shit        anger
## 46294              shit      disgust
## 46295              shit     negative
## 46296             level     positive
## 46297             level        trust
## 46298             catch     surprise
## 46299               hog      disgust
## 46300               hog     negative
## 46301              wild     negative
## 46302              wild     surprise
## 46303             start anticipation
## 46304          laughing          joy
## 46305          laughing     positive
## 46306      embarrassing     negative
## 46307              time anticipation
## 46308          stranger         fear
## 46309          stranger     negative
## 46310               bog     negative
## 46311               mad        anger
## 46312               mad      disgust
## 46313               mad         fear
## 46314               mad     negative
## 46315               mad      sadness
## 46316     schizophrenia        anger
## 46317     schizophrenia      disgust
## 46318     schizophrenia         fear
## 46319     schizophrenia     negative
## 46320     schizophrenia      sadness
## 46321           improve anticipation
## 46322           improve          joy
## 46323           improve     positive
## 46324           improve        trust
## 46325               don     positive
## 46326               don        trust
## 46327              love          joy
## 46328              love     positive
## 46329            father        trust
## 46330           teacher     positive
## 46331           teacher        trust
## 46332          fortress         fear
## 46333          fortress     positive
## 46334          fortress      sadness
## 46335          fortress        trust
## 46336              love          joy
## 46337              love     positive
## 46338              time anticipation
## 46339           majesty     positive
## 46340           majesty        trust
## 46341              real     positive
## 46342              real        trust
## 46343              time anticipation
## 46344            mother anticipation
## 46345            mother          joy
## 46346            mother     negative
## 46347            mother     positive
## 46348            mother      sadness
## 46349            mother        trust
## 46350               fun anticipation
## 46351               fun          joy
## 46352               fun     positive
## 46353              talk     positive
## 46354             wrong     negative
## 46355           brother     positive
## 46356           brother        trust
## 46357              talk     positive
## 46358             enjoy anticipation
## 46359             enjoy          joy
## 46360             enjoy     positive
## 46361             enjoy        trust
## 46362             peace anticipation
## 46363             peace          joy
## 46364             peace     positive
## 46365             peace        trust
## 46366             quiet     positive
## 46367             quiet      sadness
## 46368         isolation     negative
## 46369         isolation      sadness
## 46370              deal anticipation
## 46371              deal          joy
## 46372              deal     positive
## 46373              deal     surprise
## 46374              deal        trust
## 46375            chance     surprise
## 46376              talk     positive
## 46377             fight        anger
## 46378             fight         fear
## 46379             fight     negative
## 46380              real     positive
## 46381              real        trust
## 46382             revel          joy
## 46383             revel     positive
## 46384           ashamed      disgust
## 46385           ashamed     negative
## 46386           ashamed      sadness
## 46387             found          joy
## 46388             found     positive
## 46389             found        trust
## 46390             stint         fear
## 46391             stint     negative
## 46392             stint      sadness
## 46393           honesty     positive
## 46394           honesty        trust
## 46395              lose        anger
## 46396              lose      disgust
## 46397              lose         fear
## 46398              lose     negative
## 46399              lose      sadness
## 46400              lose     surprise
## 46401               top anticipation
## 46402               top     positive
## 46403               top        trust
## 46404             laugh          joy
## 46405             laugh     positive
## 46406             laugh     surprise
## 46407              fake     negative
## 46408             green          joy
## 46409             green     positive
## 46410             green        trust
## 46411             curse        anger
## 46412             curse      disgust
## 46413             curse         fear
## 46414             curse     negative
## 46415             curse      sadness
## 46416             title     positive
## 46417             title        trust
## 46418               fun anticipation
## 46419               fun          joy
## 46420               fun     positive
## 46421              trip     surprise
## 46422            litter     negative
## 46423              time anticipation
## 46424              blue      sadness
## 46425              talk     positive
## 46426              shit        anger
## 46427              shit      disgust
## 46428              shit     negative
## 46429              main     positive
## 46430              lone      sadness
## 46431            public anticipation
## 46432            public     positive
## 46433             catch     surprise
## 46434               don     positive
## 46435               don        trust
## 46436             scare        anger
## 46437             scare anticipation
## 46438             scare         fear
## 46439             scare     negative
## 46440             scare     surprise
## 46441            bottom     negative
## 46442            bottom      sadness
## 46443              luck anticipation
## 46444              luck          joy
## 46445              luck     positive
## 46446              luck     surprise
## 46447          agitated        anger
## 46448          agitated     negative
## 46449              pick     positive
## 46450            anchor     positive
## 46451            hidden     negative
## 46452              bank        trust
## 46453            insane        anger
## 46454            insane         fear
## 46455            insane     negative
## 46456             music          joy
## 46457             music     positive
## 46458             music      sadness
## 46459              lost     negative
## 46460              lost      sadness
## 46461              time anticipation
## 46462              sing anticipation
## 46463              sing          joy
## 46464              sing     positive
## 46465              sing      sadness
## 46466              sing        trust
## 46467             dance          joy
## 46468             dance     positive
## 46469             dance        trust
## 46470       entertained          joy
## 46471       entertained     positive
## 46472            rhythm     positive
## 46473            twitch     negative
## 46474              sing anticipation
## 46475              sing          joy
## 46476              sing     positive
## 46477              sing      sadness
## 46478              sing        trust
## 46479              time anticipation
## 46480       immediately anticipation
## 46481       immediately     negative
## 46482       immediately     positive
## 46483        completely     positive
## 46484            pretty anticipation
## 46485            pretty          joy
## 46486            pretty     positive
## 46487            pretty        trust
## 46488           tangled     negative
## 46489            change         fear
## 46490          absolute     positive
## 46491            stupid     negative
## 46492       therapeutic          joy
## 46493       therapeutic     positive
## 46494       therapeutic        trust
## 46495              damn        anger
## 46496              damn      disgust
## 46497              damn     negative
## 46498              time anticipation
## 46499        wilderness anticipation
## 46500        wilderness         fear
## 46501        wilderness      sadness
## 46502             break     surprise
## 46503           hunting        anger
## 46504           hunting anticipation
## 46505           hunting         fear
## 46506           hunting     negative
## 46507             blast        anger
## 46508             blast         fear
## 46509             blast     negative
## 46510             blast     surprise
## 46511      embarrassing     negative
## 46512             music          joy
## 46513             music     positive
## 46514             music      sadness
## 46515              sing anticipation
## 46516              sing          joy
## 46517              sing     positive
## 46518              sing      sadness
## 46519              sing        trust
## 46520             swift     positive
## 46521              glad anticipation
## 46522              glad          joy
## 46523              glad     positive
## 46524           hunting        anger
## 46525           hunting anticipation
## 46526           hunting         fear
## 46527           hunting     negative
## 46528          neighbor anticipation
## 46529          neighbor     positive
## 46530          neighbor        trust
## 46531            change         fear
## 46532             spoke     negative
## 46533          surprise         fear
## 46534          surprise          joy
## 46535          surprise     positive
## 46536          surprise     surprise
## 46537              time anticipation
## 46538             dirty      disgust
## 46539             dirty     negative
## 46540              lose        anger
## 46541              lose      disgust
## 46542              lose         fear
## 46543              lose     negative
## 46544              lose      sadness
## 46545              lose     surprise
## 46546              bite     negative
## 46547              land     positive
## 46548              wear     negative
## 46549              wear        trust
## 46550           content          joy
## 46551           content     positive
## 46552           content        trust
## 46553             break     surprise
## 46554         traveling     positive
## 46555          worrying anticipation
## 46556          worrying         fear
## 46557          worrying     negative
## 46558          worrying      sadness
## 46559             share anticipation
## 46560             share          joy
## 46561             share     positive
## 46562             share        trust
## 46563            public anticipation
## 46564            public     positive
## 46565             quiet     positive
## 46566             quiet      sadness
## 46567             enjoy anticipation
## 46568             enjoy          joy
## 46569             enjoy     positive
## 46570             enjoy        trust
## 46571            friend          joy
## 46572            friend     positive
## 46573            friend        trust
## 46574             start anticipation
## 46575             music          joy
## 46576             music     positive
## 46577             music      sadness
## 46578          annoying        anger
## 46579          annoying     negative
## 46580          laughing          joy
## 46581          laughing     positive
## 46582          standing     positive
## 46583              jaws         fear
## 46584            ground        trust
## 46585         community     positive
## 46586           cursing        anger
## 46587           cursing      disgust
## 46588           cursing     negative
## 46589          randomly     surprise
## 46590             catch     surprise
## 46591             lying        anger
## 46592             lying      disgust
## 46593             lying     negative
## 46594        unofficial     negative
## 46595         diagnosis anticipation
## 46596         diagnosis         fear
## 46597         diagnosis     negative
## 46598         diagnosis        trust
## 46599              time anticipation
## 46600             quiet     positive
## 46601             quiet      sadness
## 46602          distract     negative
## 46603             worse         fear
## 46604             worse     negative
## 46605             worse      sadness
## 46606             enjoy anticipation
## 46607             enjoy          joy
## 46608             enjoy     positive
## 46609             enjoy        trust
## 46610             peace anticipation
## 46611             peace          joy
## 46612             peace     positive
## 46613             peace        trust
## 46614             quiet     positive
## 46615             quiet      sadness
## 46616           feeling        anger
## 46617           feeling anticipation
## 46618           feeling      disgust
## 46619           feeling         fear
## 46620           feeling          joy
## 46621           feeling     negative
## 46622           feeling     positive
## 46623           feeling      sadness
## 46624           feeling     surprise
## 46625           feeling        trust
## 46626              seek anticipation
## 46627            remove        anger
## 46628            remove         fear
## 46629            remove     negative
## 46630            remove      sadness
## 46631           useless     negative
## 46632          rambling     negative
## 46633               don     positive
## 46634               don        trust
## 46635         interrupt        anger
## 46636         interrupt     negative
## 46637         interrupt     surprise
## 46638              love          joy
## 46639              love     positive
## 46640              time anticipation
## 46641          threaten        anger
## 46642          threaten anticipation
## 46643          threaten         fear
## 46644          threaten     negative
## 46645              gear     positive
## 46646            lowest     negative
## 46647            lowest      sadness
## 46648              talk     positive
## 46649              talk     positive
## 46650               don     positive
## 46651               don        trust
## 46652         providing anticipation
## 46653         providing          joy
## 46654         providing     positive
## 46655         providing        trust
## 46656              food          joy
## 46657              food     positive
## 46658              food        trust
## 46659               eat     positive
## 46660           jealous        anger
## 46661           jealous      disgust
## 46662           jealous     negative
## 46663             start anticipation
## 46664               fat      disgust
## 46665               fat     negative
## 46666               fat      sadness
## 46667              love          joy
## 46668              love     positive
## 46669           screech         fear
## 46670           screech     negative
## 46671           screech     surprise
## 46672            madman        anger
## 46673            madman         fear
## 46674            madman     negative
## 46675              word     positive
## 46676              word        trust
## 46677               don     positive
## 46678               don        trust
## 46679             happy anticipation
## 46680             happy          joy
## 46681             happy     positive
## 46682             happy        trust
## 46683             child anticipation
## 46684             child          joy
## 46685             child     positive
## 46686             spent     negative
## 46687              time anticipation
## 46688               gem          joy
## 46689               gem     positive
## 46690               fun anticipation
## 46691               fun          joy
## 46692               fun     positive
## 46693               god anticipation
## 46694               god         fear
## 46695               god          joy
## 46696               god     positive
## 46697               god        trust
## 46698              damn        anger
## 46699              damn      disgust
## 46700              damn     negative
## 46701               job     positive
## 46702              fear        anger
## 46703              fear         fear
## 46704              fear     negative
## 46705              talk     positive
## 46706              time anticipation
## 46707              bear        anger
## 46708              bear         fear
## 46709            prefer     positive
## 46710            prefer        trust
## 46711              talk     positive
## 46712              time anticipation
## 46713               bad        anger
## 46714               bad      disgust
## 46715               bad         fear
## 46716               bad     negative
## 46717               bad      sadness
## 46718             wrong     negative
## 46719            public anticipation
## 46720            public     positive
## 46721             peace anticipation
## 46722             peace          joy
## 46723             peace     positive
## 46724             peace        trust
## 46725             quiet     positive
## 46726             quiet      sadness
## 46727       opportunity anticipation
## 46728       opportunity     positive
## 46729               fun anticipation
## 46730               fun          joy
## 46731               fun     positive
## 46732             hobby          joy
## 46733             hobby     positive
## 46734            escape anticipation
## 46735            escape         fear
## 46736            escape     negative
## 46737            escape     positive
## 46738             peace anticipation
## 46739             peace          joy
## 46740             peace     positive
## 46741             peace        trust
## 46742     entertainment anticipation
## 46743     entertainment          joy
## 46744     entertainment     positive
## 46745     entertainment     surprise
## 46746     entertainment        trust
## 46747            unique     positive
## 46748            unique     surprise
## 46749               don     positive
## 46750               don        trust
## 46751               bad        anger
## 46752               bad      disgust
## 46753               bad         fear
## 46754               bad     negative
## 46755               bad      sadness
## 46756             peace anticipation
## 46757             peace          joy
## 46758             peace     positive
## 46759             peace        trust
## 46760               don     positive
## 46761               don        trust
## 46762              sing anticipation
## 46763              sing          joy
## 46764              sing     positive
## 46765              sing      sadness
## 46766              sing        trust
## 46767          nonsense     negative
## 46768             alive anticipation
## 46769             alive          joy
## 46770             alive     positive
## 46771             alive        trust
## 46772           knowing     positive
## 46773              hide         fear
## 46774               rod         fear
## 46775               rod     positive
## 46776               rod        trust
## 46777             happy anticipation
## 46778             happy          joy
## 46779             happy     positive
## 46780             happy        trust
## 46781              hell        anger
## 46782              hell      disgust
## 46783              hell         fear
## 46784              hell     negative
## 46785              hell      sadness
## 46786              talk     positive
## 46787              talk     positive
## 46788          enjoying anticipation
## 46789          enjoying          joy
## 46790          enjoying     positive
## 46791          enjoying        trust
## 46792              save          joy
## 46793              save     positive
## 46794              save        trust
## 46795              talk     positive
## 46796           pretend     negative
## 46797              damn        anger
## 46798              damn      disgust
## 46799              damn     negative
## 46800              time anticipation
## 46801               pay anticipation
## 46802               pay          joy
## 46803               pay     positive
## 46804               pay        trust
## 46805         attention     positive
## 46806              acid     negative
## 46807           reading     positive
## 46808              trip     surprise
## 46809       deliverance anticipation
## 46810       deliverance          joy
## 46811       deliverance     positive
## 46812       deliverance        trust
## 46813          personal        trust
## 46814              trip     surprise
## 46815        occasional     surprise
## 46816             wrong     negative
## 46817            public anticipation
## 46818            public     positive
## 46819              real     positive
## 46820              real        trust
## 46821               god anticipation
## 46822               god         fear
## 46823               god          joy
## 46824               god     positive
## 46825               god        trust
## 46826             sense     positive
## 46827              time anticipation
## 46828               don     positive
## 46829               don        trust
## 46830              love          joy
## 46831              love     positive
## 46832              bank        trust
## 46833              talk     positive
## 46834          annoying        anger
## 46835          annoying     negative
## 46836              love          joy
## 46837              love     positive
## 46838            writer     positive
## 46839            pardon     positive
## 46840               sir     positive
## 46841               sir        trust
## 46842            submit anticipation
## 46843          serenity anticipation
## 46844          serenity          joy
## 46845          serenity     positive
## 46846          serenity        trust
## 46847           ability     positive
## 46848         apologize     positive
## 46849         apologize      sadness
## 46850         apologize        trust
## 46851              bait         fear
## 46852              bait     negative
## 46853              bait        trust
## 46854             music          joy
## 46855             music     positive
## 46856             music      sadness
## 46857             lines         fear
## 46858           culture     positive
## 46859             fancy anticipation
## 46860             fancy          joy
## 46861             fancy     positive
## 46862               rod         fear
## 46863               rod     positive
## 46864               rod        trust
## 46865              talk     positive
## 46866             catch     surprise
## 46867              talk     positive
## 46868            spider      disgust
## 46869            spider         fear
## 46870              task     positive
## 46871              hash     negative
## 46872         arguments        anger
## 46873          practice     positive
## 46874          enjoying anticipation
## 46875          enjoying          joy
## 46876          enjoying     positive
## 46877          enjoying        trust
## 46878             level     positive
## 46879             level        trust
## 46880              lure     negative
## 46881              bite     negative
## 46882              hell        anger
## 46883              hell      disgust
## 46884              hell         fear
## 46885              hell     negative
## 46886              hell      sadness
## 46887              time anticipation
## 46888         arguments        anger
## 46889             quiet     positive
## 46890             quiet      sadness
## 46891             crazy        anger
## 46892             crazy         fear
## 46893             crazy     negative
## 46894             crazy      sadness
## 46895           brother     positive
## 46896           brother        trust
## 46897            chance     surprise
## 46898          crushing        anger
## 46899          crushing      disgust
## 46900          crushing         fear
## 46901          crushing     negative
## 46902             buddy anticipation
## 46903             buddy          joy
## 46904             buddy     positive
## 46905             buddy        trust
## 46906             buddy anticipation
## 46907             buddy          joy
## 46908             buddy     positive
## 46909             buddy        trust
## 46910            happen anticipation
## 46911              hero anticipation
## 46912              hero          joy
## 46913              hero     positive
## 46914              hero     surprise
## 46915              hero        trust
## 46916              trip     surprise
## 46917             enjoy anticipation
## 46918             enjoy          joy
## 46919             enjoy     positive
## 46920             enjoy        trust
## 46921         interrupt        anger
## 46922         interrupt     negative
## 46923         interrupt     surprise
## 46924           hearing         fear
## 46925           hearing     negative
## 46926              real     positive
## 46927              real        trust
## 46928           healthy     positive
## 46929           healthy     positive
## 46930           healthy     positive
## 46931            appeal anticipation
## 46932              talk     positive
## 46933              task     positive
## 46934              hate        anger
## 46935              hate      disgust
## 46936              hate         fear
## 46937              hate     negative
## 46938              hate      sadness
## 46939             laugh          joy
## 46940             laugh     positive
## 46941             laugh     surprise
## 46942      entertaining anticipation
## 46943      entertaining          joy
## 46944      entertaining     positive
## 46945         beautiful          joy
## 46946         beautiful     positive
## 46947          secluded     negative
## 46948          secluded      sadness
## 46949              talk     positive
## 46950             start anticipation
## 46951           pretend     negative
## 46952              whip        anger
## 46953              whip     negative
## 46954               rod         fear
## 46955               rod     positive
## 46956               rod        trust
## 46957          fighting        anger
## 46958          fighting     negative
## 46959              duke     positive
## 46960            lovely anticipation
## 46961            lovely          joy
## 46962            lovely     positive
## 46963            lovely      sadness
## 46964            lovely     surprise
## 46965            lovely        trust
## 46966             honor     positive
## 46967             honor        trust
## 46968             watch anticipation
## 46969             watch         fear
## 46970            pretty anticipation
## 46971            pretty          joy
## 46972            pretty     positive
## 46973            pretty        trust
## 46974             crazy        anger
## 46975             crazy         fear
## 46976             crazy     negative
## 46977             crazy      sadness
## 46978       agriculture     positive
## 46979           pasture     positive
## 46980       agriculture     positive
## 46981           reading     positive
## 46982               pay anticipation
## 46983               pay          joy
## 46984               pay     positive
## 46985               pay        trust
## 46986            happen anticipation
## 46987              land     positive
## 46988              land     positive
## 46989            remove        anger
## 46990            remove         fear
## 46991            remove     negative
## 46992            remove      sadness
## 46993              gain anticipation
## 46994              gain          joy
## 46995              gain     positive
## 46996              land     positive
## 46997          suitable     positive
## 46998              grow anticipation
## 46999              grow          joy
## 47000              grow     positive
## 47001              grow        trust
## 47002          rational     positive
## 47003          rational        trust
## 47004              food          joy
## 47005              food     positive
## 47006              food        trust
## 47007            system        trust
## 47008              land     positive
## 47009         including     positive
## 47010        production anticipation
## 47011        production     positive
## 47012     comprehensive     positive
## 47013             study     positive
## 47014           content          joy
## 47015           content     positive
## 47016           content        trust
## 47017             agree     positive
## 47018       agriculture     positive
## 47019             waste      disgust
## 47020             waste     negative
## 47021         resources          joy
## 47022         resources     positive
## 47023         resources        trust
## 47024            virtue     positive
## 47025            virtue        trust
## 47026            actual     positive
## 47027     unequivocally     positive
## 47028             argue        anger
## 47029             argue     negative
## 47030            ignore     negative
## 47031        irrational      disgust
## 47032        irrational         fear
## 47033        irrational     negative
## 47034             agree     positive
## 47035       agriculture     positive
## 47036             nasty        anger
## 47037             nasty      disgust
## 47038             nasty         fear
## 47039             nasty     negative
## 47040             nasty      sadness
## 47041            damage        anger
## 47042            damage      disgust
## 47043            damage     negative
## 47044            damage      sadness
## 47045       agriculture     positive
## 47046             focus     positive
## 47047       agriculture     positive
## 47048              moot     negative
## 47049       agriculture     positive
## 47050       agriculture     positive
## 47051               eat     positive
## 47052         intuitive     positive
## 47053             study     positive
## 47054          diatribe        anger
## 47055          diatribe      disgust
## 47056          diatribe     negative
## 47057     irrationality     negative
## 47058       agriculture     positive
## 47059               bad        anger
## 47060               bad      disgust
## 47061               bad         fear
## 47062               bad     negative
## 47063               bad      sadness
## 47064               eat     positive
## 47065           logical     positive
## 47066           logical     positive
## 47067        surprising     surprise
## 47068           ethical     positive
## 47069             share anticipation
## 47070             share          joy
## 47071             share     positive
## 47072             share        trust
## 47073        conspiracy         fear
## 47074         community     positive
## 47075             moral        anger
## 47076             moral     positive
## 47077             moral        trust
## 47078          idealism     positive
## 47079         arguments        anger
## 47080              wild     negative
## 47081              wild     surprise
## 47082          accurate     positive
## 47083          accurate        trust
## 47084       agriculture     positive
## 47085           harmful        anger
## 47086           harmful      disgust
## 47087           harmful         fear
## 47088           harmful     negative
## 47089           harmful      sadness
## 47090              hell        anger
## 47091              hell      disgust
## 47092              hell         fear
## 47093              hell     negative
## 47094              hell      sadness
## 47095              cute     positive
## 47096               die         fear
## 47097               die     negative
## 47098               die      sadness
## 47099         abandoned        anger
## 47100         abandoned         fear
## 47101         abandoned     negative
## 47102         abandoned      sadness
## 47103          pretense     negative
## 47104             moral        anger
## 47105             moral     positive
## 47106             moral        trust
## 47107          idealism     positive
## 47108             study     positive
## 47109             model     positive
## 47110             study     positive
## 47111            chance     surprise
## 47112          contrary     negative
## 47113             share anticipation
## 47114             share          joy
## 47115             share     positive
## 47116             share        trust
## 47117          constant     positive
## 47118          constant        trust
## 47119         knowledge     positive
## 47120               eat     positive
## 47121        discussion     positive
## 47122             force        anger
## 47123             force         fear
## 47124             force     negative
## 47125              land     positive
## 47126              food          joy
## 47127              food     positive
## 47128              food        trust
## 47129              grow anticipation
## 47130              grow          joy
## 47131              grow     positive
## 47132              grow        trust
## 47133              food          joy
## 47134              food     positive
## 47135              food        trust
## 47136          humanity          joy
## 47137          humanity     positive
## 47138          humanity        trust
## 47139              food          joy
## 47140              food     positive
## 47141              food        trust
## 47142          decrease     negative
## 47143              farm anticipation
## 47144              land     positive
## 47145         difficult         fear
## 47146          increase     positive
## 47147              deal anticipation
## 47148              deal          joy
## 47149              deal     positive
## 47150              deal     surprise
## 47151              deal        trust
## 47152          struggle        anger
## 47153          struggle         fear
## 47154          struggle     negative
## 47155          struggle      sadness
## 47156           garbage      disgust
## 47157           garbage     negative
## 47158              land     positive
## 47159       agriculture     positive
## 47160       agriculture     positive
## 47161             store anticipation
## 47162             store     positive
## 47163            change         fear
## 47164             study     positive
## 47165         declining     negative
## 47166       agriculture     positive
## 47167           leading        trust
## 47168           culprit     negative
## 47169       degradation     negative
## 47170           extinct     negative
## 47171           extinct      sadness
## 47172               don     positive
## 47173               don        trust
## 47174              land     positive
## 47175         intuition     positive
## 47176         intuition        trust
## 47177              grow anticipation
## 47178              grow          joy
## 47179              grow     positive
## 47180              grow        trust
## 47181            reason     positive
## 47182       agriculture     positive
## 47183             sense     positive
## 47184            tackle        anger
## 47185            tackle     surprise
## 47186           ethical     positive
## 47187              time anticipation
## 47188            tackle        anger
## 47189            tackle     surprise
## 47190       agriculture     positive
## 47191        aberration      disgust
## 47192        aberration     negative
## 47193              food          joy
## 47194              food     positive
## 47195              food        trust
## 47196           account        trust
## 47197          increase     positive
## 47198       agriculture     positive
## 47199              land     positive
## 47200               eat     positive
## 47201               don     positive
## 47202               don        trust
## 47203               don     positive
## 47204               don        trust
## 47205            luxury          joy
## 47206            luxury     positive
## 47207            afford     positive
## 47208             clean          joy
## 47209             clean     positive
## 47210             clean        trust
## 47211              mess      disgust
## 47212              mess     negative
## 47213            boring     negative
## 47214               lie        anger
## 47215               lie      disgust
## 47216               lie     negative
## 47217               lie      sadness
## 47218             green          joy
## 47219             green     positive
## 47220             green        trust
## 47221               lie        anger
## 47222               lie      disgust
## 47223               lie     negative
## 47224               lie      sadness
## 47225         beautiful          joy
## 47226         beautiful     positive
## 47227         beautiful          joy
## 47228         beautiful     positive
## 47229         wonderful          joy
## 47230         wonderful     positive
## 47231         wonderful     surprise
## 47232         wonderful        trust
## 47233         emptiness      sadness
## 47234           craving anticipation
## 47235              lack     negative
## 47236           provide     positive
## 47237           provide        trust
## 47238          majority          joy
## 47239          majority     positive
## 47240          majority        trust
## 47241       agriculture     positive
## 47242              land     positive
## 47243             found          joy
## 47244             found     positive
## 47245             found        trust
## 47246            lowest     negative
## 47247            lowest      sadness
## 47248              harm         fear
## 47249              harm     negative
## 47250             worry anticipation
## 47251             worry         fear
## 47252             worry     negative
## 47253             worry      sadness
## 47254               eat     positive
## 47255           minimum     negative
## 47256             daily anticipation
## 47257           bizarre     negative
## 47258           bizarre     surprise
## 47259             worry anticipation
## 47260             worry         fear
## 47261             worry     negative
## 47262             worry      sadness
## 47263            change         fear
## 47264            united     positive
## 47265            united        trust
## 47266         democracy     positive
## 47267            stupid     negative
## 47268              shit        anger
## 47269              shit      disgust
## 47270              shit     negative
## 47271           tyranny         fear
## 47272           tyranny     negative
## 47273           tyranny      sadness
## 47274          minority     negative
## 47275              land     positive
## 47276            stupid     negative
## 47277               bad        anger
## 47278               bad      disgust
## 47279               bad         fear
## 47280               bad     negative
## 47281               bad      sadness
## 47282             agree     positive
## 47283     understanding     positive
## 47284     understanding        trust
## 47285               don     positive
## 47286               don        trust
## 47287            bottom     negative
## 47288            bottom      sadness
## 47289            change         fear
## 47290            happen anticipation
## 47291             level     positive
## 47292             level        trust
## 47293               top anticipation
## 47294               top     positive
## 47295               top        trust
## 47296               don     positive
## 47297               don        trust
## 47298            choice     positive
## 47299            change         fear
## 47300               top anticipation
## 47301               top     positive
## 47302               top        trust
## 47303         influence     negative
## 47304         influence     positive
## 47305            policy        trust
## 47306          pressure     negative
## 47307          pressure     negative
## 47308            public anticipation
## 47309            public     positive
## 47310              word     positive
## 47311              word        trust
## 47312            combat        anger
## 47313            combat         fear
## 47314            combat     negative
## 47315             death        anger
## 47316             death anticipation
## 47317             death      disgust
## 47318             death         fear
## 47319             death     negative
## 47320             death      sadness
## 47321             death     surprise
## 47322            bloody        anger
## 47323            bloody      disgust
## 47324            bloody         fear
## 47325            bloody     negative
## 47326            bloody      sadness
## 47327          struggle        anger
## 47328          struggle         fear
## 47329          struggle     negative
## 47330          struggle      sadness
## 47331        convincing        trust
## 47332              fair     positive
## 47333             trade        trust
## 47334              food          joy
## 47335              food     positive
## 47336              food        trust
## 47337              dark      sadness
## 47338             money        anger
## 47339             money anticipation
## 47340             money          joy
## 47341             money     positive
## 47342             money     surprise
## 47343             money        trust
## 47344            action     positive
## 47345       immediately anticipation
## 47346       immediately     negative
## 47347       immediately     positive
## 47348            agreed     positive
## 47349            agreed        trust
## 47350              talk     positive
## 47351             cheap     negative
## 47352       degradation     negative
## 47353             faith anticipation
## 47354             faith          joy
## 47355             faith     positive
## 47356             faith        trust
## 47357             green          joy
## 47358             green     positive
## 47359             green        trust
## 47360              talk     positive
## 47361             cheap     negative
## 47362             money        anger
## 47363             money anticipation
## 47364             money          joy
## 47365             money     positive
## 47366             money     surprise
## 47367             money        trust
## 47368               don     positive
## 47369               don        trust
## 47370       degradation     negative
## 47371            change         fear
## 47372              hurt        anger
## 47373              hurt         fear
## 47374              hurt     negative
## 47375              hurt      sadness
## 47376           chicken         fear
## 47377        impossible     negative
## 47378        impossible      sadness
## 47379             guilt      disgust
## 47380             guilt     negative
## 47381             guilt      sadness
## 47382           fertile     positive
## 47383              grow anticipation
## 47384              grow          joy
## 47385              grow     positive
## 47386              grow        trust
## 47387              land     positive
## 47388        unsuitable     negative
## 47389              land     positive
## 47390             prime     positive
## 47391              land     positive
## 47392          suitable     positive
## 47393             money        anger
## 47394             money anticipation
## 47395             money          joy
## 47396             money     positive
## 47397             money     surprise
## 47398             money        trust
## 47399              vice     negative
## 47400           fertile     positive
## 47401              land     positive
## 47402              land     positive
## 47403              grow anticipation
## 47404              grow          joy
## 47405              grow     positive
## 47406              grow        trust
## 47407              love          joy
## 47408              love     positive
## 47409              land     positive
## 47410              land     positive
## 47411            hating        anger
## 47412            hating     negative
## 47413              wait anticipation
## 47414              wait     negative
## 47415              talk     positive
## 47416              land     positive
## 47417              land     positive
## 47418          suitable     positive
## 47419              vice     negative
## 47420             sense     positive
## 47421             shame      disgust
## 47422             shame         fear
## 47423             shame     negative
## 47424             shame      sadness
## 47425             agree     positive
## 47426              hate        anger
## 47427              hate      disgust
## 47428              hate         fear
## 47429              hate     negative
## 47430              hate      sadness
## 47431         criticize        anger
## 47432         criticize      disgust
## 47433         criticize         fear
## 47434         criticize     negative
## 47435         criticize      sadness
## 47436          childish     negative
## 47437             sense     positive
## 47438              hope anticipation
## 47439              hope          joy
## 47440              hope     positive
## 47441              hope     surprise
## 47442              hope        trust
## 47443              lead     positive
## 47444              harm         fear
## 47445              harm     negative
## 47446            futile     negative
## 47447            futile      sadness
## 47448           attempt anticipation
## 47449             weird      disgust
## 47450             weird     negative
## 47451              land     positive
## 47452              land     positive
## 47453          suitable     positive
## 47454       information     positive
## 47455             shame      disgust
## 47456             shame         fear
## 47457             shame     negative
## 47458             shame      sadness
## 47459             agree     positive
## 47460          negative     negative
## 47461          negative      sadness
## 47462            result anticipation
## 47463            hatred        anger
## 47464            hatred      disgust
## 47465            hatred         fear
## 47466            hatred     negative
## 47467            hatred      sadness
## 47468            stress     negative
## 47469         knowledge     positive
## 47470         cognitive     positive
## 47471        dissonance        anger
## 47472        dissonance     negative
## 47473             ready anticipation
## 47474         challenge        anger
## 47475         challenge         fear
## 47476         challenge     negative
## 47477             start anticipation
## 47478         horrified         fear
## 47479         horrified     negative
## 47480         ignorance     negative
## 47481              lack     negative
## 47482         knowledge     positive
## 47483     understanding     positive
## 47484     understanding        trust
## 47485       information     positive
## 47486             start anticipation
## 47487             truth     positive
## 47488             truth        trust
## 47489         objective anticipation
## 47490         objective     positive
## 47491         objective        trust
## 47492             truth     positive
## 47493             truth        trust
## 47494             truth     positive
## 47495             truth        trust
## 47496             truth     positive
## 47497             truth        trust
## 47498              true          joy
## 47499              true     positive
## 47500              true        trust
## 47501         statement     positive
## 47502         statement        trust
## 47503        impossible     negative
## 47504        impossible      sadness
## 47505        unpleasant      disgust
## 47506        unpleasant     negative
## 47507        unpleasant      sadness
## 47508            degree     positive
## 47509               sun anticipation
## 47510               sun          joy
## 47511               sun     positive
## 47512               sun     surprise
## 47513               sun        trust
## 47514           perfect anticipation
## 47515           perfect          joy
## 47516           perfect     positive
## 47517           perfect        trust
## 47518               hot        anger
## 47519             sunny anticipation
## 47520             sunny          joy
## 47521             sunny     positive
## 47522             sunny     surprise
## 47523             words        anger
## 47524             words     negative
## 47525         organized     positive
## 47526            stupid     negative
## 47527              land     positive
## 47528       agriculture     positive
## 47529       agriculture     positive
## 47530          majority          joy
## 47531          majority     positive
## 47532          majority        trust
## 47533       agriculture     positive
## 47534             silly          joy
## 47535             silly     negative
## 47536         arguments        anger
## 47537            refuse     negative
## 47538           fertile     positive
## 47539              land     positive
## 47540              land     positive
## 47541              grow anticipation
## 47542              grow          joy
## 47543              grow     positive
## 47544              grow        trust
## 47545              love          joy
## 47546              love     positive
## 47547              land     positive
## 47548        population     positive
## 47549              land     positive
## 47550              land     positive
## 47551              land     positive
## 47552        unsuitable     negative
## 47553          stealing      disgust
## 47554          stealing         fear
## 47555          stealing     negative
## 47556           habitat     positive
## 47557              land     positive
## 47558           fertile     positive
## 47559              land     positive
## 47560             error     negative
## 47561             error      sadness
## 47562              land     positive
## 47563              land     positive
## 47564              land     positive
## 47565       agriculture     positive
## 47566              food          joy
## 47567              food     positive
## 47568              food        trust
## 47569              food          joy
## 47570              food     positive
## 47571              food        trust
## 47572              land     positive
## 47573              land     positive
## 47574           chicken         fear
## 47575             worth     positive
## 47576              food          joy
## 47577              food     positive
## 47578              food        trust
## 47579             money        anger
## 47580             money anticipation
## 47581             money          joy
## 47582             money     positive
## 47583             money     surprise
## 47584             money        trust
## 47585              vice     negative
## 47586         suffering      disgust
## 47587         suffering         fear
## 47588         suffering     negative
## 47589         suffering      sadness
## 47590             money        anger
## 47591             money anticipation
## 47592             money          joy
## 47593             money     positive
## 47594             money     surprise
## 47595             money        trust
## 47596           fertile     positive
## 47597              land     positive
## 47598              land     positive
## 47599              grow anticipation
## 47600              grow          joy
## 47601              grow     positive
## 47602              grow        trust
## 47603           suggest        trust
## 47604         incorrect     negative
## 47605           habitat     positive
## 47606               pad     positive
## 47607              real     positive
## 47608              real        trust
## 47609        sacrifices      disgust
## 47610        sacrifices         fear
## 47611        sacrifices     negative
## 47612        sacrifices      sadness
## 47613            happen anticipation
## 47614               pay anticipation
## 47615               pay          joy
## 47616               pay     positive
## 47617               pay        trust
## 47618            jungle         fear
## 47619         emptiness      sadness
## 47620             money        anger
## 47621             money anticipation
## 47622             money          joy
## 47623             money     positive
## 47624             money     surprise
## 47625             money        trust
## 47626           cutting        anger
## 47627           cutting      disgust
## 47628           cutting         fear
## 47629           cutting     negative
## 47630           cutting      sadness
## 47631        destroying        anger
## 47632        destroying         fear
## 47633        destroying     negative
## 47634        destroying      sadness
## 47635             sadly     negative
## 47636             sadly      sadness
## 47637           killing        anger
## 47638           killing         fear
## 47639           killing     negative
## 47640           killing      sadness
## 47641             shady         fear
## 47642             shady     negative
## 47643             money        anger
## 47644             money anticipation
## 47645             money          joy
## 47646             money     positive
## 47647             money     surprise
## 47648             money        trust
## 47649               pay anticipation
## 47650               pay          joy
## 47651               pay     positive
## 47652               pay        trust
## 47653           kicking        anger
## 47654             greed        anger
## 47655             greed      disgust
## 47656             greed     negative
## 47657           corrupt     negative
## 47658              kill         fear
## 47659              kill     negative
## 47660              kill      sadness
## 47661         beautiful          joy
## 47662         beautiful     positive
## 47663        destroying        anger
## 47664        destroying         fear
## 47665        destroying     negative
## 47666        destroying      sadness
## 47667     unequivocally     positive
## 47668        propaganda     negative
## 47669           gazette     positive
## 47670           gazette        trust
## 47671        discourage         fear
## 47672        discourage     negative
## 47673        discourage      sadness
## 47674            action     positive
## 47675             study     positive
## 47676            greedy      disgust
## 47677            greedy     negative
## 47678            greedy      disgust
## 47679            greedy     negative
## 47680           corrupt     negative
## 47681            greedy      disgust
## 47682            greedy     negative
## 47683            greedy      disgust
## 47684            greedy     negative
## 47685           corrupt     negative
## 47686       agriculture     positive
## 47687       agriculture     positive
## 47688            demand        anger
## 47689            demand     negative
## 47690              love          joy
## 47691              love     positive
## 47692              belt        anger
## 47693              belt         fear
## 47694              belt     negative
## 47695             trump     surprise
## 47696             trade        trust
## 47697               war         fear
## 47698               war     negative
## 47699        depressing      disgust
## 47700        depressing     negative
## 47701        depressing      sadness
## 47702              real     positive
## 47703              real        trust
## 47704           selfish        anger
## 47705           selfish      disgust
## 47706           selfish     negative
## 47707              time anticipation
## 47708          perceive     positive
## 47709          perceive        trust
## 47710           selfish        anger
## 47711           selfish      disgust
## 47712           selfish     negative
## 47713             agree     positive
## 47714            reason     positive
## 47715               bad        anger
## 47716               bad      disgust
## 47717               bad         fear
## 47718               bad     negative
## 47719               bad      sadness
## 47720               job     positive
## 47721            spouse          joy
## 47722            spouse     positive
## 47723            spouse        trust
## 47724           divorce        anger
## 47725           divorce      disgust
## 47726           divorce         fear
## 47727           divorce     negative
## 47728           divorce      sadness
## 47729           divorce     surprise
## 47730           divorce        trust
## 47731          expected anticipation
## 47732            expect anticipation
## 47733            expect     positive
## 47734            expect     surprise
## 47735            expect        trust
## 47736             agree     positive
## 47737           special          joy
## 47738           special     positive
## 47739           respect anticipation
## 47740           respect          joy
## 47741           respect     positive
## 47742           respect        trust
## 47743             awful        anger
## 47744             awful      disgust
## 47745             awful         fear
## 47746             awful     negative
## 47747             awful      sadness
## 47748              fate anticipation
## 47749              fate     negative
## 47750               god anticipation
## 47751               god         fear
## 47752               god          joy
## 47753               god     positive
## 47754               god        trust
## 47755              luck anticipation
## 47756              luck          joy
## 47757              luck     positive
## 47758              luck     surprise
## 47759              suck     negative
## 47760            sorely     negative
## 47761            sorely      sadness
## 47762            loving          joy
## 47763            loving     positive
## 47764            loving        trust
## 47765          argument        anger
## 47766          argument     negative
## 47767         revolting        anger
## 47768         revolting      disgust
## 47769         revolting         fear
## 47770         revolting     negative
## 47771            orphan         fear
## 47772            orphan     negative
## 47773            orphan      sadness
## 47774              main     positive
## 47775            reason     positive
## 47776         guarantee     positive
## 47777         guarantee        trust
## 47778              baby          joy
## 47779              baby     positive
## 47780             child anticipation
## 47781             child          joy
## 47782             child     positive
## 47783              baby          joy
## 47784              baby     positive
## 47785         difficult         fear
## 47786             child anticipation
## 47787             child          joy
## 47788             child     positive
## 47789              shit        anger
## 47790              shit      disgust
## 47791              shit     negative
## 47792              baby          joy
## 47793              baby     positive
## 47794              baby          joy
## 47795              baby     positive
## 47796          courtesy     positive
## 47797              deal anticipation
## 47798              deal          joy
## 47799              deal     positive
## 47800              deal     surprise
## 47801              deal        trust
## 47802            mother anticipation
## 47803            mother          joy
## 47804            mother     negative
## 47805            mother     positive
## 47806            mother      sadness
## 47807            mother        trust
## 47808              baby          joy
## 47809              baby     positive
## 47810              deal anticipation
## 47811              deal          joy
## 47812              deal     positive
## 47813              deal     surprise
## 47814              deal        trust
## 47815              fake     negative
## 47816             upset        anger
## 47817             upset     negative
## 47818             upset      sadness
## 47819      hypocritical      disgust
## 47820      hypocritical     negative
## 47821           prevent         fear
## 47822          abortion      disgust
## 47823          abortion         fear
## 47824          abortion     negative
## 47825          abortion      sadness
## 47826              plan anticipation
## 47827          blessing anticipation
## 47828          blessing          joy
## 47829          blessing     positive
## 47830          blessing        trust
## 47831              plan anticipation
## 47832              baby          joy
## 47833              baby     positive
## 47834          abortion      disgust
## 47835          abortion         fear
## 47836          abortion     negative
## 47837          abortion      sadness
## 47838            reason     positive
## 47839      reproductive          joy
## 47840      reproductive     positive
## 47841             wrong     negative
## 47842           special          joy
## 47843           special     positive
## 47844             child anticipation
## 47845             child          joy
## 47846             child     positive
## 47847            misery        anger
## 47848            misery      disgust
## 47849            misery         fear
## 47850            misery     negative
## 47851            misery      sadness
## 47852          superior     positive
## 47853             abort     negative
## 47854        conscience     positive
## 47855        conscience        trust
## 47856          terrible        anger
## 47857          terrible      disgust
## 47858          terrible         fear
## 47859          terrible     negative
## 47860          terrible      sadness
## 47861              rest     positive
## 47862             birth anticipation
## 47863             birth         fear
## 47864             birth          joy
## 47865             birth     positive
## 47866             birth        trust
## 47867             abort     negative
## 47868            cancer        anger
## 47869            cancer      disgust
## 47870            cancer         fear
## 47871            cancer     negative
## 47872            cancer      sadness
## 47873            humane     positive
## 47874            create          joy
## 47875            create     positive
## 47876              damn        anger
## 47877              damn      disgust
## 47878              damn     negative
## 47879              dark      sadness
## 47880       infertility     negative
## 47881       infertility      sadness
## 47882        ridiculous        anger
## 47883        ridiculous      disgust
## 47884        ridiculous     negative
## 47885           blanket        trust
## 47886         statement     positive
## 47887         statement        trust
## 47888              time anticipation
## 47889            cancer        anger
## 47890            cancer      disgust
## 47891            cancer         fear
## 47892            cancer     negative
## 47893            cancer      sadness
## 47894            humane     positive
## 47895            create          joy
## 47896            create     positive
## 47897               sex anticipation
## 47898               sex          joy
## 47899               sex     positive
## 47900               sex        trust
## 47901            result anticipation
## 47902             child anticipation
## 47903             child          joy
## 47904             child     positive
## 47905           classic     positive
## 47906              joke     negative
## 47907        completely     positive
## 47908          abortion      disgust
## 47909          abortion         fear
## 47910          abortion     negative
## 47911          abortion      sadness
## 47912          argument        anger
## 47913          argument     negative
## 47914              baby          joy
## 47915              baby     positive
## 47916            cancer        anger
## 47917            cancer      disgust
## 47918            cancer         fear
## 47919            cancer     negative
## 47920            cancer      sadness
## 47921               god anticipation
## 47922               god         fear
## 47923               god          joy
## 47924               god     positive
## 47925               god        trust
## 47926            choice     positive
## 47927               bad        anger
## 47928               bad      disgust
## 47929               bad         fear
## 47930               bad     negative
## 47931               bad      sadness
## 47932               bad        anger
## 47933               bad      disgust
## 47934               bad         fear
## 47935               bad     negative
## 47936               bad      sadness
## 47937           develop anticipation
## 47938           develop     positive
## 47939        fanaticism         fear
## 47940             guilt      disgust
## 47941             guilt     negative
## 47942             guilt      sadness
## 47943        immorality        anger
## 47944        immorality      disgust
## 47945        immorality     negative
## 47946               ban     negative
## 47947          reaffirm     positive
## 47948            joined     positive
## 47949            giving     positive
## 47950               bad        anger
## 47951               bad      disgust
## 47952               bad         fear
## 47953               bad     negative
## 47954               bad      sadness
## 47955         committal     negative
## 47956         committal      sadness
## 47957            detest        anger
## 47958            detest      disgust
## 47959            detest     negative
## 47960             moral        anger
## 47961             moral     positive
## 47962             moral        trust
## 47963       superiority     positive
## 47964           fanatic     negative
## 47965               god anticipation
## 47966               god         fear
## 47967               god          joy
## 47968               god     positive
## 47969               god        trust
## 47970            choice     positive
## 47971               bad        anger
## 47972               bad      disgust
## 47973               bad         fear
## 47974               bad     negative
## 47975               bad      sadness
## 47976       opportunity anticipation
## 47977       opportunity     positive
## 47978          offering        trust
## 47979            choice     positive
## 47980         apologize     positive
## 47981         apologize      sadness
## 47982         apologize        trust
## 47983            choice     positive
## 47984             guess     surprise
## 47985           obvious     positive
## 47986           obvious        trust
## 47987          abortion      disgust
## 47988          abortion         fear
## 47989          abortion     negative
## 47990          abortion      sadness
## 47991              baby          joy
## 47992              baby     positive
## 47993             abort     negative
## 47994            choice     positive
## 47995       probability anticipation
## 47996             troll        anger
## 47997             troll         fear
## 47998             troll     negative
## 47999         community     positive
## 48000            pretty anticipation
## 48001            pretty          joy
## 48002            pretty     positive
## 48003            pretty        trust
## 48004         principal     positive
## 48005         principal        trust
## 48006           patient anticipation
## 48007           patient     positive
## 48008         operation         fear
## 48009         operation        trust
## 48010          ultimate anticipation
## 48011          ultimate      sadness
## 48012              time anticipation
## 48013         operation         fear
## 48014         operation        trust
## 48015             risky anticipation
## 48016             risky         fear
## 48017             risky     negative
## 48018           harvest anticipation
## 48019           harvest          joy
## 48020           harvest     positive
## 48021             force        anger
## 48022             force         fear
## 48023             force     negative
## 48024       unprotected     negative
## 48025               sex anticipation
## 48026               sex          joy
## 48027               sex     positive
## 48028               sex        trust
## 48029           obvious     positive
## 48030           obvious        trust
## 48031             shape     positive
## 48032              time anticipation
## 48033              pick     positive
## 48034          optional     positive
## 48035             start anticipation
## 48036        affliction      disgust
## 48037        affliction         fear
## 48038        affliction     negative
## 48039        affliction      sadness
## 48040          thankful          joy
## 48041          thankful     positive
## 48042             fight        anger
## 48043             fight         fear
## 48044             fight     negative
## 48045          abortion      disgust
## 48046          abortion         fear
## 48047          abortion     negative
## 48048          abortion      sadness
## 48049           finally anticipation
## 48050           finally      disgust
## 48051           finally          joy
## 48052           finally     positive
## 48053           finally     surprise
## 48054           finally        trust
## 48055               bad        anger
## 48056               bad      disgust
## 48057               bad         fear
## 48058               bad     negative
## 48059               bad      sadness
## 48060        ultimately anticipation
## 48061        ultimately     positive
## 48062         destroyed        anger
## 48063         destroyed         fear
## 48064         destroyed     negative
## 48065         destroyed      sadness
## 48066           helpful          joy
## 48067           helpful     positive
## 48068           helpful        trust
## 48069            result anticipation
## 48070        production anticipation
## 48071        production     positive
## 48072         pregnancy      disgust
## 48073         pregnancy     negative
## 48074         terminate      sadness
## 48075             found          joy
## 48076             found     positive
## 48077             found        trust
## 48078          argument        anger
## 48079          argument     negative
## 48080              hell        anger
## 48081              hell      disgust
## 48082              hell         fear
## 48083              hell     negative
## 48084              hell      sadness
## 48085             worse         fear
## 48086             worse     negative
## 48087             worse      sadness
## 48088              glad anticipation
## 48089              glad          joy
## 48090              glad     positive
## 48091               don     positive
## 48092               don        trust
## 48093               bad        anger
## 48094               bad      disgust
## 48095               bad         fear
## 48096               bad     negative
## 48097               bad      sadness
## 48098           selfish        anger
## 48099           selfish      disgust
## 48100           selfish     negative
## 48101               bad        anger
## 48102               bad      disgust
## 48103               bad         fear
## 48104               bad     negative
## 48105               bad      sadness
## 48106           brother     positive
## 48107           brother        trust
## 48108             spent     negative
## 48109         expecting anticipation
## 48110             spent     negative
## 48111           savings     positive
## 48112              plan anticipation
## 48113             fight        anger
## 48114             fight         fear
## 48115             fight     negative
## 48116              time anticipation
## 48117           brother     positive
## 48118           brother        trust
## 48119           brother     positive
## 48120           brother        trust
## 48121              pull     positive
## 48122               ass     negative
## 48123              time anticipation
## 48124               job     positive
## 48125          complain        anger
## 48126          complain     negative
## 48127          complain      sadness
## 48128           massage          joy
## 48129           massage     positive
## 48130               god anticipation
## 48131               god         fear
## 48132               god          joy
## 48133               god     positive
## 48134               god        trust
## 48135             money        anger
## 48136             money anticipation
## 48137             money          joy
## 48138             money     positive
## 48139             money     surprise
## 48140             money        trust
## 48141           brother     positive
## 48142           brother        trust
## 48143           intense        anger
## 48144           intense      disgust
## 48145           intense         fear
## 48146           intense          joy
## 48147           intense     negative
## 48148           intense     positive
## 48149           intense     surprise
## 48150           intense        trust
## 48151             money        anger
## 48152             money anticipation
## 48153             money          joy
## 48154             money     positive
## 48155             money     surprise
## 48156             money        trust
## 48157           feeling        anger
## 48158           feeling anticipation
## 48159           feeling      disgust
## 48160           feeling         fear
## 48161           feeling          joy
## 48162           feeling     negative
## 48163           feeling     positive
## 48164           feeling      sadness
## 48165           feeling     surprise
## 48166           feeling        trust
## 48167               bad        anger
## 48168               bad      disgust
## 48169               bad         fear
## 48170               bad     negative
## 48171               bad      sadness
## 48172           feeling        anger
## 48173           feeling anticipation
## 48174           feeling      disgust
## 48175           feeling         fear
## 48176           feeling          joy
## 48177           feeling     negative
## 48178           feeling     positive
## 48179           feeling      sadness
## 48180           feeling     surprise
## 48181           feeling        trust
## 48182               bad        anger
## 48183               bad      disgust
## 48184               bad         fear
## 48185               bad     negative
## 48186               bad      sadness
## 48187              love          joy
## 48188              love     positive
## 48189             awful        anger
## 48190             awful      disgust
## 48191             awful         fear
## 48192             awful     negative
## 48193             awful      sadness
## 48194            guilty        anger
## 48195            guilty     negative
## 48196            guilty      sadness
## 48197           selfish        anger
## 48198           selfish      disgust
## 48199           selfish     negative
## 48200           feeling        anger
## 48201           feeling anticipation
## 48202           feeling      disgust
## 48203           feeling         fear
## 48204           feeling          joy
## 48205           feeling     negative
## 48206           feeling     positive
## 48207           feeling      sadness
## 48208           feeling     surprise
## 48209           feeling        trust
## 48210               bad        anger
## 48211               bad      disgust
## 48212               bad         fear
## 48213               bad     negative
## 48214               bad      sadness
## 48215               don     positive
## 48216               don        trust
## 48217               bad        anger
## 48218               bad      disgust
## 48219               bad         fear
## 48220               bad     negative
## 48221               bad      sadness
## 48222         believing     positive
## 48223         believing        trust
## 48224        respecting     positive
## 48225         suffering      disgust
## 48226         suffering         fear
## 48227         suffering     negative
## 48228         suffering      sadness
## 48229               bad        anger
## 48230               bad      disgust
## 48231               bad         fear
## 48232               bad     negative
## 48233               bad      sadness
## 48234         believing     positive
## 48235         believing        trust
## 48236           selfish        anger
## 48237           selfish      disgust
## 48238           selfish     negative
## 48239         resources          joy
## 48240         resources     positive
## 48241         resources        trust
## 48242        supporting     positive
## 48243        supporting        trust
## 48244          pleasant anticipation
## 48245          pleasant          joy
## 48246          pleasant     positive
## 48247          pleasant     surprise
## 48248          pleasant        trust
## 48249            school        trust
## 48250               god anticipation
## 48251               god         fear
## 48252               god          joy
## 48253               god     positive
## 48254               god        trust
## 48255               sky     positive
## 48256            unable     negative
## 48257            unable      sadness
## 48258            oppose     negative
## 48259          abortion      disgust
## 48260          abortion         fear
## 48261          abortion     negative
## 48262          abortion      sadness
## 48263           suicide        anger
## 48264           suicide         fear
## 48265           suicide     negative
## 48266           suicide      sadness
## 48267               god anticipation
## 48268               god         fear
## 48269               god          joy
## 48270               god     positive
## 48271               god        trust
## 48272       infertility     negative
## 48273       infertility      sadness
## 48274         destroyed        anger
## 48275         destroyed         fear
## 48276         destroyed     negative
## 48277         destroyed      sadness
## 48278              time anticipation
## 48279        prostitute      disgust
## 48280        prostitute     negative
## 48281           worried     negative
## 48282           worried      sadness
## 48283               bad        anger
## 48284               bad      disgust
## 48285               bad         fear
## 48286               bad     negative
## 48287               bad      sadness
## 48288           worried     negative
## 48289           worried      sadness
## 48290           disease        anger
## 48291           disease      disgust
## 48292           disease         fear
## 48293           disease     negative
## 48294           disease      sadness
## 48295            mother anticipation
## 48296            mother          joy
## 48297            mother     negative
## 48298            mother     positive
## 48299            mother      sadness
## 48300            mother        trust
## 48301           funeral      sadness
## 48302             labor anticipation
## 48303             labor          joy
## 48304             labor     positive
## 48305             labor     surprise
## 48306             labor        trust
## 48307           funeral      sadness
## 48308     inappropriate        anger
## 48309     inappropriate      disgust
## 48310     inappropriate     negative
## 48311     inappropriate      sadness
## 48312              pain         fear
## 48313              pain     negative
## 48314              pain      sadness
## 48315              true          joy
## 48316              true     positive
## 48317              true        trust
## 48318          continue anticipation
## 48319          continue     positive
## 48320          continue        trust
## 48321           journey anticipation
## 48322           journey         fear
## 48323           journey          joy
## 48324           journey     positive
## 48325              safe          joy
## 48326              safe     positive
## 48327              safe        trust
## 48328             argue        anger
## 48329             argue     negative
## 48330              love          joy
## 48331              love     positive
## 48332           selfish        anger
## 48333           selfish      disgust
## 48334           selfish     negative
## 48335              love          joy
## 48336              love     positive
## 48337             child anticipation
## 48338             child          joy
## 48339             child     positive
## 48340               don     positive
## 48341               don        trust
## 48342              lazy     negative
## 48343              pill     positive
## 48344              pill        trust
## 48345               don     positive
## 48346               don        trust
## 48347           miracle anticipation
## 48348           miracle          joy
## 48349           miracle     positive
## 48350           miracle     surprise
## 48351           miracle        trust
## 48352              risk anticipation
## 48353              risk         fear
## 48354              risk     negative
## 48355             trust        trust
## 48356           missing         fear
## 48357           missing     negative
## 48358           missing      sadness
## 48359           surgery         fear
## 48360           surgery      sadness
## 48361            remove        anger
## 48362            remove         fear
## 48363            remove     negative
## 48364            remove      sadness
## 48365               bad        anger
## 48366               bad      disgust
## 48367               bad         fear
## 48368               bad     negative
## 48369               bad      sadness
## 48370          argument        anger
## 48371          argument     negative
## 48372              true          joy
## 48373              true     positive
## 48374              true        trust
## 48375             child anticipation
## 48376             child          joy
## 48377             child     positive
## 48378            afford     positive
## 48379            afford     positive
## 48380             child anticipation
## 48381             child          joy
## 48382             child     positive
## 48383             child anticipation
## 48384             child          joy
## 48385             child     positive
## 48386              hell        anger
## 48387              hell      disgust
## 48388              hell         fear
## 48389              hell     negative
## 48390              hell      sadness
## 48391            bother     negative
## 48392           survive     positive
## 48393        remarkable          joy
## 48394        remarkable     positive
## 48395        remarkable     surprise
## 48396        remarkable        trust
## 48397           special          joy
## 48398           special     positive
## 48399           killing        anger
## 48400           killing         fear
## 48401           killing     negative
## 48402           killing      sadness
## 48403           deserve        anger
## 48404           deserve anticipation
## 48405           deserve     positive
## 48406           deserve        trust
## 48407               die         fear
## 48408               die     negative
## 48409               die      sadness
## 48410              hate        anger
## 48411              hate      disgust
## 48412              hate         fear
## 48413              hate     negative
## 48414              hate      sadness
## 48415          marriage anticipation
## 48416          marriage          joy
## 48417          marriage     positive
## 48418          marriage        trust
## 48419              jail         fear
## 48420              jail     negative
## 48421              jail      sadness
## 48422          sympathy     positive
## 48423          sympathy      sadness
## 48424              vote        anger
## 48425              vote anticipation
## 48426              vote          joy
## 48427              vote     negative
## 48428              vote     positive
## 48429              vote      sadness
## 48430              vote     surprise
## 48431              vote        trust
## 48432               don     positive
## 48433               don        trust
## 48434           selfish        anger
## 48435           selfish      disgust
## 48436           selfish     negative
## 48437              hope anticipation
## 48438              hope          joy
## 48439              hope     positive
## 48440              hope     surprise
## 48441              hope        trust
## 48442             money        anger
## 48443             money anticipation
## 48444             money          joy
## 48445             money     positive
## 48446             money     surprise
## 48447             money        trust
## 48448             money        anger
## 48449             money anticipation
## 48450             money          joy
## 48451             money     positive
## 48452             money     surprise
## 48453             money        trust
## 48454          sympathy     positive
## 48455          sympathy      sadness
## 48456             money        anger
## 48457             money anticipation
## 48458             money          joy
## 48459             money     positive
## 48460             money     surprise
## 48461             money        trust
## 48462             spent     negative
## 48463              baby          joy
## 48464              baby     positive
## 48465            insane        anger
## 48466            insane         fear
## 48467            insane     negative
## 48468              baby          joy
## 48469              baby     positive
## 48470              baby          joy
## 48471              baby     positive
## 48472               don     positive
## 48473               don        trust
## 48474             awful        anger
## 48475             awful      disgust
## 48476             awful         fear
## 48477             awful     negative
## 48478             awful      sadness
## 48479             awful        anger
## 48480             awful      disgust
## 48481             awful         fear
## 48482             awful     negative
## 48483             awful      sadness
## 48484             money        anger
## 48485             money anticipation
## 48486             money          joy
## 48487             money     positive
## 48488             money     surprise
## 48489             money        trust
## 48490         fruitless     negative
## 48491         fruitless      sadness
## 48492               don     positive
## 48493               don        trust
## 48494           hurting        anger
## 48495           hurting         fear
## 48496           hurting     negative
## 48497           hurting      sadness
## 48498            option     positive
## 48499           ethical     positive
## 48500             happy anticipation
## 48501             happy          joy
## 48502             happy     positive
## 48503             happy        trust
## 48504             child anticipation
## 48505             child          joy
## 48506             child     positive
## 48507          question     positive
## 48508            advice        trust
## 48509              earn     positive
## 48510             money        anger
## 48511             money anticipation
## 48512             money          joy
## 48513             money     positive
## 48514             money     surprise
## 48515             money        trust
## 48516             child anticipation
## 48517             child          joy
## 48518             child     positive
## 48519             money        anger
## 48520             money anticipation
## 48521             money          joy
## 48522             money     positive
## 48523             money     surprise
## 48524             money        trust
## 48525            afford     positive
## 48526               don     positive
## 48527               don        trust
## 48528             agree     positive
## 48529           immoral        anger
## 48530           immoral      disgust
## 48531           immoral         fear
## 48532           immoral     negative
## 48533           immoral      sadness
## 48534         downright        trust
## 48535             child anticipation
## 48536             child          joy
## 48537             child     positive
## 48538             spent     negative
## 48539              debt     negative
## 48540              debt      sadness
## 48541             happy anticipation
## 48542             happy          joy
## 48543             happy     positive
## 48544             happy        trust
## 48545             proud anticipation
## 48546             proud          joy
## 48547             proud     positive
## 48548             proud        trust
## 48549             child anticipation
## 48550             child          joy
## 48551             child     positive
## 48552           poverty        anger
## 48553           poverty      disgust
## 48554           poverty         fear
## 48555           poverty     negative
## 48556           poverty      sadness
## 48557           selfish        anger
## 48558           selfish      disgust
## 48559           selfish     negative
## 48560           worried     negative
## 48561           worried      sadness
## 48562             child anticipation
## 48563             child          joy
## 48564             child     positive
## 48565               bad        anger
## 48566               bad      disgust
## 48567               bad         fear
## 48568               bad     negative
## 48569               bad      sadness
## 48570             child anticipation
## 48571             child          joy
## 48572             child     positive
## 48573              love          joy
## 48574              love     positive
## 48575               don     positive
## 48576               don        trust
## 48577           deserve        anger
## 48578           deserve anticipation
## 48579           deserve     positive
## 48580           deserve        trust
## 48581             crazy        anger
## 48582             crazy         fear
## 48583             crazy     negative
## 48584             crazy      sadness
## 48585             money        anger
## 48586             money anticipation
## 48587             money          joy
## 48588             money     positive
## 48589             money     surprise
## 48590             money        trust
## 48591         guarantee     positive
## 48592         guarantee        trust
## 48593         guarantee     positive
## 48594         guarantee        trust
## 48595               don     positive
## 48596               don        trust
## 48597               bad        anger
## 48598               bad      disgust
## 48599               bad         fear
## 48600               bad     negative
## 48601               bad      sadness
## 48602               don     positive
## 48603               don        trust
## 48604             awful        anger
## 48605             awful      disgust
## 48606             awful         fear
## 48607             awful     negative
## 48608             awful      sadness
## 48609            beauty          joy
## 48610            beauty     positive
## 48611             money        anger
## 48612             money anticipation
## 48613             money          joy
## 48614             money     positive
## 48615             money     surprise
## 48616             money        trust
## 48617             child anticipation
## 48618             child          joy
## 48619             child     positive
## 48620             money        anger
## 48621             money anticipation
## 48622             money          joy
## 48623             money     positive
## 48624             money     surprise
## 48625             money        trust
## 48626             wrong     negative
## 48627             wrong     negative
## 48628             agree     positive
## 48629           immoral        anger
## 48630           immoral      disgust
## 48631           immoral         fear
## 48632           immoral     negative
## 48633           immoral      sadness
## 48634           immoral        anger
## 48635           immoral      disgust
## 48636           immoral         fear
## 48637           immoral     negative
## 48638           immoral      sadness
## 48639          worrying anticipation
## 48640          worrying         fear
## 48641          worrying     negative
## 48642          worrying      sadness
## 48643           immoral        anger
## 48644           immoral      disgust
## 48645           immoral         fear
## 48646           immoral     negative
## 48647           immoral      sadness
## 48648           selfish        anger
## 48649           selfish      disgust
## 48650           selfish     negative
## 48651            broken        anger
## 48652            broken         fear
## 48653            broken     negative
## 48654            broken      sadness
## 48655              shit        anger
## 48656              shit      disgust
## 48657              shit     negative
## 48658          suddenly     surprise
## 48659           immoral        anger
## 48660           immoral      disgust
## 48661           immoral         fear
## 48662           immoral     negative
## 48663           immoral      sadness
## 48664             fixed        trust
## 48665           immoral        anger
## 48666           immoral      disgust
## 48667           immoral         fear
## 48668           immoral     negative
## 48669           immoral      sadness
## 48670            create          joy
## 48671            create     positive
## 48672           selfish        anger
## 48673           selfish      disgust
## 48674           selfish     negative
## 48675              fair     positive
## 48676               don     positive
## 48677               don        trust
## 48678             agree     positive
## 48679              onus     negative
## 48680            system        trust
## 48681              onus     negative
## 48682            choice     positive
## 48683               die         fear
## 48684               die     negative
## 48685               die      sadness
## 48686              baby          joy
## 48687              baby     positive
## 48688            create          joy
## 48689            create     positive
## 48690          politics        anger
## 48691              vote        anger
## 48692              vote anticipation
## 48693              vote          joy
## 48694              vote     negative
## 48695              vote     positive
## 48696              vote      sadness
## 48697              vote     surprise
## 48698              vote        trust
## 48699          politics        anger
## 48700              true          joy
## 48701              true     positive
## 48702              true        trust
## 48703      reproductive          joy
## 48704      reproductive     positive
## 48705          question     positive
## 48706          disagree        anger
## 48707          disagree     negative
## 48708               don     positive
## 48709               don        trust
## 48710           immoral        anger
## 48711           immoral      disgust
## 48712           immoral         fear
## 48713           immoral     negative
## 48714           immoral      sadness
## 48715            refuse     negative
## 48716            larger      disgust
## 48717            larger     surprise
## 48718            larger        trust
## 48719            larger      disgust
## 48720            larger     surprise
## 48721            larger        trust
## 48722             agree     positive
## 48723            coming anticipation
## 48724           respect anticipation
## 48725           respect          joy
## 48726           respect     positive
## 48727           respect        trust
## 48728              time anticipation
## 48729        discussion     positive
## 48730           immoral        anger
## 48731           immoral      disgust
## 48732           immoral         fear
## 48733           immoral     negative
## 48734           immoral      sadness
## 48735             force        anger
## 48736             force         fear
## 48737             force     negative
## 48738             child anticipation
## 48739             child          joy
## 48740             child     positive
## 48741             child anticipation
## 48742             child          joy
## 48743             child     positive
## 48744             puppy anticipation
## 48745             puppy     positive
## 48746             puppy        trust
## 48747              mill anticipation
## 48748          terrible        anger
## 48749          terrible      disgust
## 48750          terrible         fear
## 48751          terrible     negative
## 48752          terrible      sadness
## 48753           immoral        anger
## 48754           immoral      disgust
## 48755           immoral         fear
## 48756           immoral     negative
## 48757           immoral      sadness
## 48758             force        anger
## 48759             force         fear
## 48760             force     negative
## 48761             child anticipation
## 48762             child          joy
## 48763             child     positive
## 48764            system        trust
## 48765            system        trust
## 48766         prejudice        anger
## 48767         prejudice     negative
## 48768              bias        anger
## 48769              bias     negative
## 48770          judicial anticipation
## 48771          judicial     positive
## 48772          judicial        trust
## 48773            system        trust
## 48774            change         fear
## 48775            guilty        anger
## 48776            guilty     negative
## 48777            guilty      sadness
## 48778               don     positive
## 48779               don        trust
## 48780            system        trust
## 48781            coming anticipation
## 48782           immoral        anger
## 48783           immoral      disgust
## 48784           immoral         fear
## 48785           immoral     negative
## 48786           immoral      sadness
## 48787             birth anticipation
## 48788             birth         fear
## 48789             birth          joy
## 48790             birth     positive
## 48791             birth        trust
## 48792          negative     negative
## 48793          negative      sadness
## 48794            system        trust
## 48795              bias        anger
## 48796              bias     negative
## 48797              bias        anger
## 48798              bias     negative
## 48799             birth anticipation
## 48800             birth         fear
## 48801             birth          joy
## 48802             birth     positive
## 48803             birth        trust
## 48804               don     positive
## 48805               don        trust
## 48806          negative     negative
## 48807          negative      sadness
## 48808              food          joy
## 48809              food     positive
## 48810              food        trust
## 48811          abortion      disgust
## 48812          abortion         fear
## 48813          abortion     negative
## 48814          abortion      sadness
## 48815          argument        anger
## 48816          argument     negative
## 48817          argument        anger
## 48818          argument     negative
## 48819          illusion     negative
## 48820          illusion     surprise
## 48821          defeated     negative
## 48822          defeated      sadness
## 48823       proposition     positive
## 48824       proposition     positive
## 48825        refutation         fear
## 48826          argument        anger
## 48827          argument     negative
## 48828       proposition     positive
## 48829         arguments        anger
## 48830            debate     positive
## 48831           surgery         fear
## 48832           surgery      sadness
## 48833           immoral        anger
## 48834           immoral      disgust
## 48835           immoral         fear
## 48836           immoral     negative
## 48837           immoral      sadness
## 48838             money        anger
## 48839             money anticipation
## 48840             money          joy
## 48841             money     positive
## 48842             money     surprise
## 48843             money        trust
## 48844             worry anticipation
## 48845             worry         fear
## 48846             worry     negative
## 48847             worry      sadness
## 48848           beating        anger
## 48849           beating         fear
## 48850           beating     negative
## 48851           beating      sadness
## 48852               bad        anger
## 48853               bad      disgust
## 48854               bad         fear
## 48855               bad     negative
## 48856               bad      sadness
## 48857             waste      disgust
## 48858             waste     negative
## 48859              time anticipation
## 48860             money        anger
## 48861             money anticipation
## 48862             money          joy
## 48863             money     positive
## 48864             money     surprise
## 48865             money        trust
## 48866            morals        anger
## 48867            morals anticipation
## 48868            morals      disgust
## 48869            morals          joy
## 48870            morals     positive
## 48871            morals     surprise
## 48872            morals        trust
## 48873            happen anticipation
## 48874          abortion      disgust
## 48875          abortion         fear
## 48876          abortion     negative
## 48877          abortion      sadness
## 48878           immoral        anger
## 48879           immoral      disgust
## 48880           immoral         fear
## 48881           immoral     negative
## 48882           immoral      sadness
## 48883          abortion      disgust
## 48884          abortion         fear
## 48885          abortion     negative
## 48886          abortion      sadness
## 48887            reason     positive
## 48888            choice     positive
## 48889          abortion      disgust
## 48890          abortion         fear
## 48891          abortion     negative
## 48892          abortion      sadness
## 48893              baby          joy
## 48894              baby     positive
## 48895             scare        anger
## 48896             scare anticipation
## 48897             scare         fear
## 48898             scare     negative
## 48899             scare     surprise
## 48900           medical anticipation
## 48901           medical         fear
## 48902           medical     positive
## 48903           medical        trust
## 48904        aggressive        anger
## 48905        aggressive         fear
## 48906        aggressive     negative
## 48907        ridiculous        anger
## 48908        ridiculous      disgust
## 48909        ridiculous     negative
## 48910               don     positive
## 48911               don        trust
## 48912               don     positive
## 48913               don        trust
## 48914               bad        anger
## 48915               bad      disgust
## 48916               bad         fear
## 48917               bad     negative
## 48918               bad      sadness
## 48919     controversial        anger
## 48920     controversial     negative
## 48921               bad        anger
## 48922               bad      disgust
## 48923               bad         fear
## 48924               bad     negative
## 48925               bad      sadness
## 48926              joke     negative
## 48927         pregnancy      disgust
## 48928         pregnancy     negative
## 48929            crying     negative
## 48930            crying      sadness
## 48931            expect anticipation
## 48932            expect     positive
## 48933            expect     surprise
## 48934            expect        trust
## 48935         including     positive
## 48936               don     positive
## 48937               don        trust
## 48938       infertility     negative
## 48939       infertility      sadness
## 48940              fair     positive
## 48941               don     positive
## 48942               don        trust
## 48943             force        anger
## 48944             force         fear
## 48945             force     negative
## 48946            joking     positive
## 48947              joke     negative
## 48948          stranger         fear
## 48949          stranger     negative
## 48950           excited anticipation
## 48951           excited          joy
## 48952           excited     positive
## 48953           excited     surprise
## 48954           excited        trust
## 48955       miscarriage         fear
## 48956       miscarriage     negative
## 48957       miscarriage      sadness
## 48958              baby          joy
## 48959              baby     positive
## 48960               don     positive
## 48961               don        trust
## 48962            system        trust
## 48963            system        trust
## 48964            forced         fear
## 48965            forced     negative
## 48966             birth anticipation
## 48967             birth         fear
## 48968             birth          joy
## 48969             birth     positive
## 48970             birth        trust
## 48971          suddenly     surprise
## 48972            choice     positive
## 48973             child anticipation
## 48974             child          joy
## 48975             child     positive
## 48976           selfish        anger
## 48977           selfish      disgust
## 48978           selfish     negative
## 48979               bad        anger
## 48980               bad      disgust
## 48981               bad         fear
## 48982               bad     negative
## 48983               bad      sadness
## 48984             awful        anger
## 48985             awful      disgust
## 48986             awful         fear
## 48987             awful     negative
## 48988             awful      sadness
## 48989               bad        anger
## 48990               bad      disgust
## 48991               bad         fear
## 48992               bad     negative
## 48993               bad      sadness
## 48994         statement     positive
## 48995         statement        trust
## 48996           selfish        anger
## 48997           selfish      disgust
## 48998           selfish     negative
## 48999            reason     positive
## 49000          accident         fear
## 49001          accident     negative
## 49002          accident      sadness
## 49003          accident     surprise
## 49004          continue anticipation
## 49005          continue     positive
## 49006          continue        trust
## 49007           selfish        anger
## 49008           selfish      disgust
## 49009           selfish     negative
## 49010            agreed     positive
## 49011            agreed        trust
## 49012              fake     negative
## 49013            honest        anger
## 49014            honest      disgust
## 49015            honest         fear
## 49016            honest          joy
## 49017            honest     positive
## 49018            honest      sadness
## 49019            honest        trust
## 49020              time anticipation
## 49021            excuse     negative
## 49022             awful        anger
## 49023             awful      disgust
## 49024             awful         fear
## 49025             awful     negative
## 49026             awful      sadness
## 49027             money        anger
## 49028             money anticipation
## 49029             money          joy
## 49030             money     positive
## 49031             money     surprise
## 49032             money        trust
## 49033              time anticipation
## 49034       infertility     negative
## 49035       infertility      sadness
## 49036            unable     negative
## 49037            unable      sadness
## 49038            afford     positive
## 49039          personal        trust
## 49040             faith anticipation
## 49041             faith          joy
## 49042             faith     positive
## 49043             faith        trust
## 49044             child anticipation
## 49045             child          joy
## 49046             child     positive
## 49047           happily          joy
## 49048           happily     positive
## 49049              time anticipation
## 49050             child anticipation
## 49051             child          joy
## 49052             child     positive
## 49053             child anticipation
## 49054             child          joy
## 49055             child     positive
## 49056             weird      disgust
## 49057             weird     negative
## 49058             upset        anger
## 49059             upset     negative
## 49060             upset      sadness
## 49061             spent     negative
## 49062           selfish        anger
## 49063           selfish      disgust
## 49064           selfish     negative
## 49065             child anticipation
## 49066             child          joy
## 49067             child     positive
## 49068            friend          joy
## 49069            friend     positive
## 49070            friend        trust
## 49071              cool     positive
## 49072             child anticipation
## 49073             child          joy
## 49074             child     positive
## 49075           selfish        anger
## 49076           selfish      disgust
## 49077           selfish     negative
## 49078           illegal        anger
## 49079           illegal      disgust
## 49080           illegal         fear
## 49081           illegal     negative
## 49082           illegal      sadness
## 49083            choice     positive
## 49084           immoral        anger
## 49085           immoral      disgust
## 49086           immoral         fear
## 49087           immoral     negative
## 49088           immoral      sadness
## 49089            result anticipation
## 49090        successful anticipation
## 49091        successful          joy
## 49092        successful     positive
## 49093        successful        trust
## 49094               sex anticipation
## 49095               sex          joy
## 49096               sex     positive
## 49097               sex        trust
## 49098           immoral        anger
## 49099           immoral      disgust
## 49100           immoral         fear
## 49101           immoral     negative
## 49102           immoral      sadness
## 49103          donation     positive
## 49104         objection        anger
## 49105         objection     negative
## 49106             weird      disgust
## 49107             weird     negative
## 49108             child anticipation
## 49109             child          joy
## 49110             child     positive
## 49111            mother anticipation
## 49112            mother          joy
## 49113            mother     negative
## 49114            mother     positive
## 49115            mother      sadness
## 49116            mother        trust
## 49117          romantic anticipation
## 49118          romantic          joy
## 49119          romantic     positive
## 49120          romantic        trust
## 49121        supporting     positive
## 49122        supporting        trust
## 49123           excited anticipation
## 49124           excited          joy
## 49125           excited     positive
## 49126           excited     surprise
## 49127           excited        trust
## 49128           brother     positive
## 49129           brother        trust
## 49130            reason     positive
## 49131             spoke     negative
## 49132            father        trust
## 49133            afraid         fear
## 49134            afraid     negative
## 49135           feeling        anger
## 49136           feeling anticipation
## 49137           feeling      disgust
## 49138           feeling         fear
## 49139           feeling          joy
## 49140           feeling     negative
## 49141           feeling     positive
## 49142           feeling      sadness
## 49143           feeling     surprise
## 49144           feeling        trust
## 49145            father        trust
## 49146           selfish        anger
## 49147           selfish      disgust
## 49148           selfish     negative
## 49149           immoral        anger
## 49150           immoral      disgust
## 49151           immoral         fear
## 49152           immoral     negative
## 49153           immoral      sadness
## 49154             child anticipation
## 49155             child          joy
## 49156             child     positive
## 49157               job     positive
## 49158           immoral        anger
## 49159           immoral      disgust
## 49160           immoral         fear
## 49161           immoral     negative
## 49162           immoral      sadness
## 49163             upset        anger
## 49164             upset     negative
## 49165             upset      sadness
## 49166             money        anger
## 49167             money anticipation
## 49168             money          joy
## 49169             money     positive
## 49170             money     surprise
## 49171             money        trust
## 49172        alcoholism        anger
## 49173        alcoholism      disgust
## 49174        alcoholism         fear
## 49175        alcoholism     negative
## 49176        alcoholism      sadness
## 49177         supported     positive
## 49178             cover        trust
## 49179          expenses     negative
## 49180             child anticipation
## 49181             child          joy
## 49182             child     positive
## 49183             money        anger
## 49184             money anticipation
## 49185             money          joy
## 49186             money     positive
## 49187             money     surprise
## 49188             money        trust
## 49189           falling     negative
## 49190           falling      sadness
## 49191         addiction     negative
## 49192        accessible     positive
## 49193             taboo      disgust
## 49194             taboo         fear
## 49195             taboo     negative
## 49196             guess     surprise
## 49197              time anticipation
## 49198             share anticipation
## 49199             share          joy
## 49200             share     positive
## 49201             share        trust
## 49202            offend        anger
## 49203            offend      disgust
## 49204            offend     negative
## 49205             share anticipation
## 49206             share          joy
## 49207             share     positive
## 49208             share        trust
## 49209       infertility     negative
## 49210       infertility      sadness
## 49211             treat        anger
## 49212             treat anticipation
## 49213             treat      disgust
## 49214             treat         fear
## 49215             treat          joy
## 49216             treat     negative
## 49217             treat     positive
## 49218             treat      sadness
## 49219             treat     surprise
## 49220             treat        trust
## 49221             money        anger
## 49222             money anticipation
## 49223             money          joy
## 49224             money     positive
## 49225             money     surprise
## 49226             money        trust
## 49227            stupid     negative
## 49228            stupid     negative
## 49229           surgery         fear
## 49230           surgery      sadness
## 49231             naive     negative
## 49232       infertility     negative
## 49233       infertility      sadness
## 49234           disease        anger
## 49235           disease      disgust
## 49236           disease         fear
## 49237           disease     negative
## 49238           disease      sadness
## 49239              blue      sadness
## 49240               bad        anger
## 49241               bad      disgust
## 49242               bad         fear
## 49243               bad     negative
## 49244               bad      sadness
## 49245           surgery         fear
## 49246           surgery      sadness
## 49247            change         fear
## 49248         effective     positive
## 49249         effective        trust
## 49250       infertility     negative
## 49251       infertility      sadness
## 49252           healthy     positive
## 49253           healthy     positive
## 49254               don     positive
## 49255               don        trust
## 49256           selfish        anger
## 49257           selfish      disgust
## 49258           selfish     negative
## 49259          struggle        anger
## 49260          struggle         fear
## 49261          struggle     negative
## 49262          struggle      sadness
## 49263           selfish        anger
## 49264           selfish      disgust
## 49265           selfish     negative
## 49266           provide     positive
## 49267           provide        trust
## 49268             child anticipation
## 49269             child          joy
## 49270             child     positive
## 49271               don     positive
## 49272               don        trust
## 49273       selfishness     negative
## 49274            forced         fear
## 49275            forced     negative
## 49276        government         fear
## 49277        government     negative
## 49278            forced         fear
## 49279            forced     negative
## 49280           selfish        anger
## 49281           selfish      disgust
## 49282           selfish     negative
## 49283             dying        anger
## 49284             dying      disgust
## 49285             dying         fear
## 49286             dying     negative
## 49287             dying      sadness
## 49288          abortion      disgust
## 49289          abortion         fear
## 49290          abortion     negative
## 49291          abortion      sadness
## 49292            forced         fear
## 49293            forced     negative
## 49294             child anticipation
## 49295             child          joy
## 49296             child     positive
## 49297          struggle        anger
## 49298          struggle         fear
## 49299          struggle     negative
## 49300          struggle      sadness
## 49301            choice     positive
## 49302             money        anger
## 49303             money anticipation
## 49304             money          joy
## 49305             money     positive
## 49306             money     surprise
## 49307             money        trust
## 49308           provide     positive
## 49309           provide        trust
## 49310             dying        anger
## 49311             dying      disgust
## 49312             dying         fear
## 49313             dying     negative
## 49314             dying      sadness
## 49315       infertility     negative
## 49316       infertility      sadness
## 49317           selfish        anger
## 49318           selfish      disgust
## 49319           selfish     negative
## 49320           selfish        anger
## 49321           selfish      disgust
## 49322           selfish     negative
## 49323          disagree        anger
## 49324          disagree     negative
## 49325           selfish        anger
## 49326           selfish      disgust
## 49327           selfish     negative
## 49328             share anticipation
## 49329             share          joy
## 49330             share     positive
## 49331             share        trust
## 49332           selfish        anger
## 49333           selfish      disgust
## 49334           selfish     negative
## 49335             child anticipation
## 49336             child          joy
## 49337             child     positive
## 49338             money        anger
## 49339             money anticipation
## 49340             money          joy
## 49341             money     positive
## 49342             money     surprise
## 49343             money        trust
## 49344             money        anger
## 49345             money anticipation
## 49346             money          joy
## 49347             money     positive
## 49348             money     surprise
## 49349             money        trust
## 49350             money        anger
## 49351             money anticipation
## 49352             money          joy
## 49353             money     positive
## 49354             money     surprise
## 49355             money        trust
## 49356             money        anger
## 49357             money anticipation
## 49358             money          joy
## 49359             money     positive
## 49360             money     surprise
## 49361             money        trust
## 49362             child anticipation
## 49363             child          joy
## 49364             child     positive
## 49365           selfish        anger
## 49366           selfish      disgust
## 49367           selfish     negative
## 49368          designer     positive
## 49369              baby          joy
## 49370              baby     positive
## 49371            broken        anger
## 49372            broken         fear
## 49373            broken     negative
## 49374            broken      sadness
## 49375             money        anger
## 49376             money anticipation
## 49377             money          joy
## 49378             money     positive
## 49379             money     surprise
## 49380             money        trust
## 49381            orphan         fear
## 49382            orphan     negative
## 49383            orphan      sadness
## 49384       selfishness     negative
## 49385             money        anger
## 49386             money anticipation
## 49387             money          joy
## 49388             money     positive
## 49389             money     surprise
## 49390             money        trust
## 49391           selfish        anger
## 49392           selfish      disgust
## 49393           selfish     negative
## 49394             money        anger
## 49395             money anticipation
## 49396             money          joy
## 49397             money     positive
## 49398             money     surprise
## 49399             money        trust
## 49400          designer     positive
## 49401              baby          joy
## 49402              baby     positive
## 49403            choice     positive
## 49404             money        anger
## 49405             money anticipation
## 49406             money          joy
## 49407             money     positive
## 49408             money     surprise
## 49409             money        trust
## 49410  misunderstanding        anger
## 49411  misunderstanding     negative
## 49412  misunderstanding      sadness
## 49413            option     positive
## 49414               don     positive
## 49415               don        trust
## 49416       selfishness     negative
## 49417            choice     positive
## 49418             child anticipation
## 49419             child          joy
## 49420             child     positive
## 49421             child anticipation
## 49422             child          joy
## 49423             child     positive
## 49424             money        anger
## 49425             money anticipation
## 49426             money          joy
## 49427             money     positive
## 49428             money     surprise
## 49429             money        trust
## 49430             child anticipation
## 49431             child          joy
## 49432             child     positive
## 49433             cheap     negative
## 49434         providing anticipation
## 49435         providing          joy
## 49436         providing     positive
## 49437         providing        trust
## 49438               don     positive
## 49439               don        trust
## 49440           related        trust
## 49441            happen anticipation
## 49442           predict anticipation
## 49443             death        anger
## 49444             death anticipation
## 49445             death      disgust
## 49446             death         fear
## 49447             death     negative
## 49448             death      sadness
## 49449             death     surprise
## 49450             leave     negative
## 49451             leave      sadness
## 49452             leave     surprise
## 49453            unable     negative
## 49454            unable      sadness
## 49455           provide     positive
## 49456           provide        trust
## 49457           abandon         fear
## 49458           abandon     negative
## 49459           abandon      sadness
## 49460             child anticipation
## 49461             child          joy
## 49462             child     positive
## 49463       opportunity anticipation
## 49464       opportunity     positive
## 49465           provide     positive
## 49466           provide        trust
## 49467               don     positive
## 49468               don        trust
## 49469             child anticipation
## 49470             child          joy
## 49471             child     positive
## 49472            unkind        anger
## 49473            unkind      disgust
## 49474            unkind         fear
## 49475            unkind     negative
## 49476            unkind      sadness
## 49477     uncomfortable     negative
## 49478            guilty        anger
## 49479            guilty     negative
## 49480            guilty      sadness
## 49481            choice     positive
## 49482          abortion      disgust
## 49483          abortion         fear
## 49484          abortion     negative
## 49485          abortion      sadness
## 49486          offering        trust
## 49487         pregnancy      disgust
## 49488         pregnancy     negative
## 49489      reproductive          joy
## 49490      reproductive     positive
## 49491             learn     positive
## 49492           achieve          joy
## 49493           achieve     positive
## 49494           achieve        trust
## 49495           attempt anticipation
## 49496             major     positive
## 49497            giving     positive
## 49498             birth anticipation
## 49499             birth         fear
## 49500             birth          joy
## 49501             birth     positive
## 49502             birth        trust
## 49503             child anticipation
## 49504             child          joy
## 49505             child     positive
## 49506             slave        anger
## 49507             slave         fear
## 49508             slave     negative
## 49509             slave      sadness
## 49510           pollute      disgust
## 49511           pollute     negative
## 49512             agree     positive
## 49513           account        trust
## 49514              time anticipation
## 49515          familiar     positive
## 49516          familiar        trust
## 49517         community     positive
## 49518           account        trust
## 49519            action     positive
## 49520           contact     positive
## 49521        completely     positive
## 49522             agree     positive
## 49523             haven     positive
## 49524             haven        trust
## 49525              gain anticipation
## 49526              gain          joy
## 49527              gain     positive
## 49528        possession        anger
## 49529        possession      disgust
## 49530        possession         fear
## 49531        possession     negative
## 49532              rest     positive
## 49533           ancient     negative
## 49534             guess     surprise
## 49535              cult         fear
## 49536              cult     negative
## 49537              time anticipation
## 49538           missing         fear
## 49539           missing     negative
## 49540           missing      sadness
## 49541              true          joy
## 49542              true     positive
## 49543              true        trust
## 49544            leader     positive
## 49545            leader        trust
## 49546          daughter          joy
## 49547          daughter     positive
## 49548            friend          joy
## 49549            friend     positive
## 49550            friend        trust
## 49551            leader     positive
## 49552            leader        trust
## 49553           prevent         fear
## 49554         pollution      disgust
## 49555         pollution     negative
## 49556          regulate     positive
## 49557              save          joy
## 49558              save     positive
## 49559              save        trust
## 49560               die         fear
## 49561               die     negative
## 49562               die      sadness
## 49563             demon        anger
## 49564             demon      disgust
## 49565             demon         fear
## 49566             demon     negative
## 49567             demon      sadness
## 49568          exchange     positive
## 49569          exchange        trust
## 49570           vampire        anger
## 49571           vampire      disgust
## 49572           vampire         fear
## 49573           vampire     negative
## 49574           villain         fear
## 49575           villain     negative
## 49576              lost     negative
## 49577              lost      sadness
## 49578            dragon         fear
## 49579            priest     positive
## 49580            priest        trust
## 49581            escape anticipation
## 49582            escape         fear
## 49583            escape     negative
## 49584            escape     positive
## 49585          oblivion        anger
## 49586          oblivion         fear
## 49587          oblivion     negative
## 49588            insane        anger
## 49589            insane         fear
## 49590            insane     negative
## 49591             court        anger
## 49592             court anticipation
## 49593             court         fear
## 49594          daughter          joy
## 49595          daughter     positive
## 49596              rape        anger
## 49597              rape      disgust
## 49598              rape         fear
## 49599              rape     negative
## 49600              rape      sadness
## 49601               god anticipation
## 49602               god         fear
## 49603               god          joy
## 49604               god     positive
## 49605               god        trust
## 49606             worry anticipation
## 49607             worry         fear
## 49608             worry     negative
## 49609             worry      sadness
## 49610              true          joy
## 49611              true     positive
## 49612              true        trust
## 49613             clown anticipation
## 49614             clown          joy
## 49615             clown     positive
## 49616             clown     surprise
## 49617            murder        anger
## 49618            murder      disgust
## 49619            murder         fear
## 49620            murder     negative
## 49621            murder      sadness
## 49622            murder     surprise
## 49623               ass     negative
## 49624              love          joy
## 49625              love     positive
## 49626             chase     negative
## 49627               ass     negative
## 49628             melee         fear
## 49629             melee     negative
## 49630            hungry anticipation
## 49631            hungry     negative
## 49632          unsavory     negative
## 49633            pretty anticipation
## 49634            pretty          joy
## 49635            pretty     positive
## 49636            pretty        trust
## 49637               ass     negative
## 49638              cult         fear
## 49639              cult     negative
## 49640         confirmed     positive
## 49641         confirmed        trust
## 49642              hope anticipation
## 49643              hope          joy
## 49644              hope     positive
## 49645              hope     surprise
## 49646              hope        trust
## 49647              damn        anger
## 49648              damn      disgust
## 49649              damn     negative
## 49650               sun anticipation
## 49651               sun          joy
## 49652               sun     positive
## 49653               sun     surprise
## 49654               sun        trust
## 49655          weakness     negative
## 49656              damn        anger
## 49657              damn      disgust
## 49658              damn     negative
## 49659               sun anticipation
## 49660               sun          joy
## 49661               sun     positive
## 49662               sun     surprise
## 49663               sun        trust
## 49664             build     positive
## 49665              real     positive
## 49666              real        trust
## 49667              talk     positive
## 49668              plan anticipation
## 49669           ungodly     negative
## 49670           ungodly      sadness
## 49671          horrific        anger
## 49672          horrific      disgust
## 49673          horrific         fear
## 49674          horrific     negative
## 49675          horrific      sadness
## 49676           tactics         fear
## 49677           tactics        trust
## 49678          fighting        anger
## 49679          fighting     negative
## 49680              true          joy
## 49681              true     positive
## 49682              true        trust
## 49683             enemy        anger
## 49684             enemy      disgust
## 49685             enemy         fear
## 49686             enemy     negative
## 49687              time anticipation
## 49688               sun anticipation
## 49689               sun          joy
## 49690               sun     positive
## 49691               sun     surprise
## 49692               sun        trust
## 49693             fight        anger
## 49694             fight         fear
## 49695             fight     negative
## 49696             fight        anger
## 49697             fight         fear
## 49698             fight     negative
## 49699              late     negative
## 49700              late      sadness
## 49701        conspiracy         fear
## 49702            action     positive
## 49703           contact     positive
## 49704            sticky      disgust
## 49705              rule         fear
## 49706              rule        trust
## 49707        conspiracy         fear
## 49708              rule         fear
## 49709              rule        trust
## 49710        conspiracy         fear
## 49711              rest     positive
## 49712        discussion     positive
## 49713        conspiracy         fear
## 49714            action     positive
## 49715           contact     positive
## 49716          received     positive
## 49717        discipline         fear
## 49718        discipline     negative
## 49719       termination     negative
## 49720       termination      sadness
## 49721            letter anticipation
## 49722            school        trust
## 49723          received     positive
## 49724          abortion      disgust
## 49725          abortion         fear
## 49726          abortion     negative
## 49727          abortion      sadness
## 49728           liberty anticipation
## 49729           liberty          joy
## 49730           liberty     positive
## 49731           liberty     surprise
## 49732           liberty        trust
## 49733           teacher     positive
## 49734           teacher        trust
## 49735               sex anticipation
## 49736               sex          joy
## 49737               sex     positive
## 49738               sex        trust
## 49739              gasp     surprise
## 49740             lying        anger
## 49741             lying      disgust
## 49742             lying     negative
## 49743         professor     positive
## 49744         professor        trust
## 49745          received     positive
## 49746         exemplary     positive
## 49747           subject     negative
## 49748        discipline         fear
## 49749        discipline     negative
## 49750              time anticipation
## 49751          personal        trust
## 49752             quote anticipation
## 49753             quote     negative
## 49754             quote     positive
## 49755             quote     surprise
## 49756               law        trust
## 49757         professor     positive
## 49758         professor        trust
## 49759               law        trust
## 49760         statement     positive
## 49761         statement        trust
## 49762            school        trust
## 49763         professor     positive
## 49764         professor        trust
## 49765          abortion      disgust
## 49766          abortion         fear
## 49767          abortion     negative
## 49768          abortion      sadness
## 49769            fairly     positive
## 49770            fairly        trust
## 49771         fabricate     negative
## 49772              hope anticipation
## 49773              hope          joy
## 49774              hope     positive
## 49775              hope     surprise
## 49776              hope        trust
## 49777             daily anticipation
## 49778              mail anticipation
## 49779              tale     positive
## 49780             start anticipation
## 49781           reading     positive
## 49782            actual     positive
## 49783             enjoy anticipation
## 49784             enjoy          joy
## 49785             enjoy     positive
## 49786             enjoy        trust
## 49787             angry        anger
## 49788             angry      disgust
## 49789             angry     negative
## 49790           engaged anticipation
## 49791           engaged          joy
## 49792           engaged     positive
## 49793           engaged        trust
## 49794               don     positive
## 49795               don        trust
## 49796            career anticipation
## 49797            career     positive
## 49798               sex anticipation
## 49799               sex          joy
## 49800               sex     positive
## 49801               sex        trust
## 49802        ridiculous        anger
## 49803        ridiculous      disgust
## 49804        ridiculous     negative
## 49805          personal        trust
## 49806           ethical     positive
## 49807              jury        trust
## 49808            reason     positive
## 49809        university anticipation
## 49810        university     positive
## 49811           lawsuit        anger
## 49812           lawsuit      disgust
## 49813           lawsuit         fear
## 49814           lawsuit     negative
## 49815           lawsuit      sadness
## 49816           lawsuit     surprise
## 49817          religion        trust
## 49818            center     positive
## 49819            center        trust
## 49820            system        trust
## 49821         construct     positive
## 49822           lawsuit        anger
## 49823           lawsuit      disgust
## 49824           lawsuit         fear
## 49825           lawsuit     negative
## 49826           lawsuit      sadness
## 49827           lawsuit     surprise
## 49828             wrong     negative
## 49829         frivolous     negative
## 49830             broke         fear
## 49831             broke     negative
## 49832             broke      sadness
## 49833         construct     positive
## 49834               sex anticipation
## 49835               sex          joy
## 49836               sex     positive
## 49837               sex        trust
## 49838       expectation anticipation
## 49839       expectation     positive
## 49840            reason     positive
## 49841        university anticipation
## 49842        university     positive
## 49843           lawsuit        anger
## 49844           lawsuit      disgust
## 49845           lawsuit         fear
## 49846           lawsuit     negative
## 49847           lawsuit      sadness
## 49848           lawsuit     surprise
## 49849       termination     negative
## 49850       termination      sadness
## 49851               sex anticipation
## 49852               sex          joy
## 49853               sex     positive
## 49854               sex        trust
## 49855          religion        trust
## 49856             stark     negative
## 49857             stark        trust
## 49858          religion        trust
## 49859            cherry     positive
## 49860              pick     positive
## 49861        scientific     positive
## 49862        scientific        trust
## 49863             model     positive
## 49864            center     positive
## 49865            center        trust
## 49866            system        trust
## 49867            church anticipation
## 49868            church          joy
## 49869            church     positive
## 49870            church        trust
## 49871         construct     positive
## 49872         construct     positive
## 49873          pressure     negative
## 49874       termination     negative
## 49875       termination      sadness
## 49876               sex anticipation
## 49877               sex          joy
## 49878               sex     positive
## 49879               sex        trust
## 49880         professor     positive
## 49881         professor        trust
## 49882          endeavor anticipation
## 49883          endeavor     positive
## 49884             study     positive
## 49885         professor     positive
## 49886         professor        trust
## 49887         professor     positive
## 49888         professor        trust
## 49889       termination     negative
## 49890       termination      sadness
## 49891               sex anticipation
## 49892               sex          joy
## 49893               sex     positive
## 49894               sex        trust
## 49895        ridiculous        anger
## 49896        ridiculous      disgust
## 49897        ridiculous     negative
## 49898            taught        trust
## 49899            reason     positive
## 49900          scrutiny     negative
## 49901              jury        trust
## 49902           faculty     positive
## 49903           faculty        trust
## 49904            pretty anticipation
## 49905            pretty          joy
## 49906            pretty     positive
## 49907            pretty        trust
## 49908         competent     positive
## 49909         competent        trust
## 49910               sue        anger
## 49911               sue     negative
## 49912               sue      sadness
## 49913             study     positive
## 49914             guess     surprise
## 49915        scientific     positive
## 49916        scientific        trust
## 49917        hypothesis anticipation
## 49918        hypothesis     surprise
## 49919           account        trust
## 49920     understanding     positive
## 49921     understanding        trust
## 49922            pretty anticipation
## 49923            pretty          joy
## 49924            pretty     positive
## 49925            pretty        trust
## 49926        contradict        anger
## 49927        contradict     negative
## 49928             study     positive
## 49929          absolute     positive
## 49930            drivel      disgust
## 49931            drivel     negative
## 49932             study     positive
## 49933          efficacy     positive
## 49934         infection         fear
## 49935         infection     negative
## 49936             death        anger
## 49937             death anticipation
## 49938             death      disgust
## 49939             death         fear
## 49940             death     negative
## 49941             death      sadness
## 49942             death     surprise
## 49943        manipulate     negative
## 49944         believing     positive
## 49945         believing        trust
## 49946              gain anticipation
## 49947              gain          joy
## 49948              gain     positive
## 49949         deceiving     negative
## 49950         deceiving        trust
## 49951              shit        anger
## 49952              shit      disgust
## 49953              shit     negative
## 49954         dependent     negative
## 49955         dependent     positive
## 49956         dependent        trust
## 49957          stranded     negative
## 49958            desert        anger
## 49959            desert      disgust
## 49960            desert         fear
## 49961            desert     negative
## 49962            desert      sadness
## 49963         infection         fear
## 49964         infection     negative
## 49965               god anticipation
## 49966               god         fear
## 49967               god          joy
## 49968               god     positive
## 49969               god        trust
## 49970       credibility     positive
## 49971       credibility        trust
## 49972        conspiracy         fear
## 49973          nonsense     negative
## 49974           vaccine     positive
## 49975              kill         fear
## 49976              kill     negative
## 49977              kill      sadness
## 49978            unable     negative
## 49979            unable      sadness
## 49980              kill         fear
## 49981              kill     negative
## 49982              kill      sadness
## 49983              sick      disgust
## 49984              sick     negative
## 49985              sick      sadness
## 49986           disease        anger
## 49987           disease      disgust
## 49988           disease         fear
## 49989           disease     negative
## 49990           disease      sadness
## 49991              real     positive
## 49992              real        trust
## 49993          pandemic         fear
## 49994          pandemic     negative
## 49995          pandemic      sadness
## 49996             study     positive
## 49997             ready anticipation
## 49998        scientific     positive
## 49999        scientific        trust
##  [ reached 'max' / getOption("max.print") -- omitted 52469 rows ]

Sentiment Analysis

  • What sentiments appear in our data?
table(tidy_comments$sentiment)
## 
##        anger anticipation      disgust         fear          joy     negative 
##         8453         8898         5555        10863         6959        17193 
##     positive      sadness     surprise        trust 
##        20689         7674         3864        12320

Sentiment Analysis

library(ggplot2)

ggplot(tidy_comments, aes(y = sentiment))+
  geom_bar(aes(fill = sentiment))+
  theme_minimal()+
  labs(title = "Sentiments in Climate Change Reddit Posts")

Sentiment Analysis

library(ggplot2)

ggplot(tidy_comments, aes(y = sentiment))+
  geom_bar(aes(fill = sentiment))+
  theme_minimal()+
  labs(title = "Sentiments in Climate Change Reddit Posts")
  • Take 5 minutes to replicate the graphic. If done, try:
  • Plotting the posts rather than the comments
  • Plotting sentiments from a different set of comments/posts
  • Changing the color scheme
  • Interpreting the results

Class Plan

  • Data activity (10 min)
  • Sentiment Analysis (40 min)
  • Break (5 min)
  • Discuss Cape Town Water Crisis (10 min)
  • Sentiment Analysis on Cape Town Water Crisis (25 min)
  • Final project time (Remainder)

Week 4 Groups!

print.data.frame(groups)
##               group 1                 group 2                 group 3
## 1         Tian, Zerui         Gnanam, Akash Y               Su, Barry
## 2     Knutson, Blue C   Leong, Wen Hou Lester    Dotson, Bianca Ciara
## 3        Shah, Jainam   Widodo, Ignazio Marco Alsayegh, Aisha E H M I
## 4 Andrew Yu Ming Xin, Spindler, Laine Addison     Albertini, Federico
##            group 4                   group 5                  group 6
## 1    Cai, Qingyuan              Ng, Michelle                         
## 2    Ning, Zhi Yan    Cortez, Hugo Alexander Huynh Le Hue Tam, Vivian
## 3                  Saccone, Alexander Connor           Somyurek, Ecem
## 4 Wan Rosli, Nadia           Tan, Zheng Yang             Gupta, Umang
##                            group 7
## 1              Premkrishna, Shrish
## 2 Ramos, Jessica Andria Potestades
## 3               Jun, Ernest Ng Wei
## 4                    Lim, Fang Jan

Data Activity

  • Task: communicate a message about the data using a visual approach of your choosing.
  • Consider: There is too much information to convey here! What is important and what is not?
  • Visualization does not need to be complete!

Sentiment Analysis

  • The Reddit data also include “scores” (upvotes - downvotes)
  • Which sentiments get the highest scores?
# create dataset with one row for each sentiment
sentiments_scores <- tidy_comments %>%
  group_by(sentiment) %>%
  summarise(mean_score = mean(score, na.rm = T))

Sentiment Analysis

  • What did we just do?
  • group_by() tells R to perform each operation on the groups of rows separately (i.e. on each sentiment)
  • summarise() tells R to summarize the data, so we end up with just one row per group
# create dataset with one row for each sentiment
sentiments_scores <- tidy_comments %>%
  group_by(sentiment) %>%
  summarise(mean_score = mean(score, na.rm = T))

Sentiment Analysis

  • Which sentiments received the highest scores? Why do you think this is?
  • If you have time, try plotting these results (use or modify the code from course reader)
  • We will leave this for the problem set

Sentiment Analysis Over Time

Sentiment Analysis Over Time

Sentiment Analysis Over Time

  • Data are in Canvas/Files/Data/the-reddit-climate-change-dataset-posts.csv
# read all time climate change posts
cc_alltime_reddit <- read_csv("the-reddit-climate-change-dataset-posts.csv")
  • What will we want to do next?

Sentiment Analysis Over Time

  • Make it Tidy Text!
# tidytext format
tidy_cc <- cc_alltime_reddit %>%
   unnest_tokens(word, title)

# now remove stop words
tidy_cc %<>%
  anti_join(stop_words)

Sentiment Analysis Over Time

  • Now let’s create a dataset with aggregated sentiment over time
  • What’s going on here?
# create AFINN sentiments over time dataframe
afinn <- tidy_cc %>% 
  inner_join(get_sentiments("afinn")) %>% 
  group_by(index = created_utc %/% 604800) %>% 
  summarise(sentiment = sum(value)) %>% 
  mutate(method = "AFINN")

afinn
## # A tibble: 661 × 3
##    index sentiment method
##    <dbl>     <dbl> <chr> 
##  1  2087       -92 AFINN 
##  2  2088      -115 AFINN 
##  3  2089       -32 AFINN 
##  4  2090       -87 AFINN 
##  5  2091       -72 AFINN 
##  6  2092      -143 AFINN 
##  7  2093      -170 AFINN 
##  8  2094      -130 AFINN 
##  9  2095       -87 AFINN 
## 10  2096       -45 AFINN 
## # ℹ 651 more rows

Sentiment Analysis Over Time

  • inner_join() we have used this before!
  • group_by() groups rows by the time index
  • %/% performs integer division
  • Time is measured in “Epoch Time” (seconds since 1970), 604800 is the number of seconds per week (see Epoch Converter for more)
  • summarise() aggregates the sentiment for each time period
  • mutate() creates a new variable, we will call this AFINN
# create AFINN sentiments over time dataframe
afinn <- tidy_cc %>% 
  inner_join(get_sentiments("afinn")) %>% 
  group_by(index = created_utc %/% 604800) %>% 
  summarise(sentiment = sum(value)) %>% 
  mutate(method = "AFINN")

Sentiment Analysis Over Time

  • In groups, plot data
  • Can you modify the plot in any ways to improve it?
  • What happened around 2600 (this is roughly October 2019)?
# plot afinn over time
ggplot(afinn, aes(index, sentiment, fill = method)) +
  geom_col()

Sentiment Analysis Over Time

  • We can also plot all three!
  • Why is the third one different than the other two?

Cape Town Water Crisis

Cape Town Water Crisis

  • Cape Town experienced a drought from 2015-2018
  • City took a number of steps to encourage people to use less water, and fine wasteful users
  • Still, consumption was higher than dam replenishment
  • “Day Zero” loomed: a scenario where city taps would be shut off and water would be gathered at public points

Cape Town Water Crisis

Cape Town Water Crisis

  • What changed?
  • Government tariffs and messaging were somewhat effective
  • Avg water usage per person decreased from 1,100 megalitres/day in March 2015 -> 500 megalitres/day in March 2018
  • What were these strategies?

Cape Town Water Crisis

  • Levels 1-6B of increasing restrictions and tariffs
  • Ranging from irrigation restrictions to no carwashing, to 50ml/day limit per resident
  • Public list of the roads where the top 100 water users lived (Name and Shame Campaign)

Cape Town Water Crisis

  • Manzi the Water Mascot

Cape Town Water Crisis

  • Launched a water map of households below limits (highlight positive behaviors)

Cape Town Water Crisis

  • Still, most of the water goals were not met in order to avoid Day Zero
  • Rainfall picked up in 2018, nearing average levels and ending the drought

Cape Town Water Crisis

  • In groups, discuss:
  • How do you think sentiment changed throughout the water crisis?

Sentiment Around Cape Town Water Crisis

  • Let’s limit the climate change Reddit posts to only those about Cape Town or a Water Crisis
  • To do this, we’ll use str_detect() from the stringr package
# limit to data with mention of cape town water crisis
cape_town_words <- c("Cape Town", "water crisis", "Water Crisis",
                     "cape town")

# limit to posts that include any cape town or water crisis related words
cape_town_posts <- cc_alltime_reddit %>%
  filter(str_detect(title, paste(cape_town_words, collapse = "|")))
  • What next?

Sentiment Around Cape Town Water Crisis

  • Make it Tidy Text!
# make tidytext
tidy_cape_town <- cape_town_posts %>%
  unnest_tokens(word, title) %>%
  anti_join(stop_words)

Sentiment Around Cape Town Water Crisis

  • Now we can aggregate over time
afinn_ct <- tidy_cape_town %>% 
  inner_join(get_sentiments("afinn")) %>% 
  group_by(index = created_utc %/% 604800) %>% 
  summarise(sentiment = sum(value)) %>% 
  mutate(method = "AFINN")

Sentiment Around Cape Town Water Crisis

  • In groups: what if we wanted to change the time period to years rather than weeks?
  • May want to see epochconverter.com
# create afinn dataset
afinn_ct <- tidy_cape_town %>% 
  inner_join(get_sentiments("afinn")) %>% 
  group_by(index = created_utc %/% 604800) %>% 
  summarise(sentiment = sum(value)) %>% 
  mutate(method = "AFINN")

Sentiment Around Cape Town Water Crisis

  • Plot sentiments over time
# plot sentiment over time for cape town posts
ggplot(afinn_ct, aes(index, sentiment, fill = method)) +
  geom_col()

Sentiment Around Cape Town Water Crisis

  • We can modify this to add context

Sentiment Around Cape Town Water Crisis

  • Does sentiment correspond to water levels?

Sentiment Around Cape Town Water Crisis

  • Maybe we want to look at most common positive/negative words around water crisis
## # A tibble: 103 × 3
##    word        sentiment     n
##    <chr>       <chr>     <int>
##  1 crisis      negative    187
##  2 drought     negative     41
##  3 horrifying  negative     25
##  4 blame       negative     14
##  5 threatening negative      9
##  6 breaking    negative      8
##  7 crowded     negative      8
##  8 sinking     negative      8
##  9 worse       negative      8
## 10 critical    negative      5
## # ℹ 93 more rows

Sentiment Around Cape Town Water Crisis

  • We can plot the top 10 positive/negative words

Problem Set 4

  • Similar to previous problem sets
  • If RedditExtractoR is giving you trouble for questions 1-2, feel free to use climate_comments.Rdata from the Canvas files

Mid-Course Feedback

Final Projects

  • Feedback on proposals coming!
  • We will sign up for presentation times in coming days
  • Zoom options will be available

Final Project Presentation Schedule

  • Presentations will be August 15 and 17
  • Sign-up for slots will open in Canvas Collaborations Friday 7/21 at 10:00am