Bigfoot Final Project

Reine Albite

library(tidyverse)
## -- Attaching packages --------------------------------------- tidyverse 1.3.1 --
## v ggplot2 3.3.5     v purrr   0.3.4
## v tibble  3.1.6     v dplyr   1.0.7
## v tidyr   1.1.4     v stringr 1.4.0
## v readr   2.1.1     v forcats 0.5.1
## -- Conflicts ------------------------------------------ tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag()    masks stats::lag()
library(ggplot2)
library(dplyr)
library(ggthemes)
## Warning: package 'ggthemes' was built under R version 4.1.3
library(wordcloud)
## Warning: package 'wordcloud' was built under R version 4.1.3
## Loading required package: RColorBrewer
library(RColorBrewer)

Downloading the Data from Tidy Tuesday

tuesdata <- tidytuesdayR::tt_load('2022-09-13')
## --- Compiling #TidyTuesday Information for 2022-09-13 ----
## --- There is 1 file available ---
## --- Starting Download ---
## 
##  Downloading file 1 of 1: `bigfoot.csv`
## --- Download complete ---
tuesdata <- tidytuesdayR::tt_load(2022, week = 37)
## --- Compiling #TidyTuesday Information for 2022-09-13 ----
## --- There is 1 file available ---
## --- Starting Download ---
## 
##  Downloading file 1 of 1: `bigfoot.csv`
## --- Download complete ---
bigfoot <- tuesdata$bigfoot
bigfoot <- readr::read_csv('https://raw.githubusercontent.com/rfordatascience/tidytuesday/master/data/2022/2022-09-13/bigfoot.csv')
## Rows: 5021 Columns: 28
## -- Column specification --------------------------------------------------------
## Delimiter: ","
## chr  (10): observed, location_details, county, state, season, title, classif...
## dbl  (17): latitude, longitude, number, temperature_high, temperature_mid, t...
## date  (1): date
## 
## i Use `spec()` to retrieve the full column specification for this data.
## i Specify the column types or set `show_col_types = FALSE` to quiet this message.

Cleaning the data

bigfoot2c <- na.omit(bigfoot)
bigfoot2c[!duplicated(bigfoot2c), ]
## # A tibble: 722 x 28
##    observed        location_details county state season title latitude longitude
##    <chr>           <chr>            <chr>  <chr> <chr>  <chr>    <dbl>     <dbl>
##  1 "I was on my w~ Close to Clarem~ Sulli~ New ~ Summer Repo~     43.4     -72.3
##  2 "It was August~ Waterloo Road, ~ Warre~ New ~ Summer Repo~     40.9     -74.8
##  3 "After getting~ Wayne National ~ Washi~ Ohio  Fall   Repo~     39.4     -81.4
##  4 "I've told ver~ In a developmen~ Washi~ Rhod~ Summer Repo~     41.4     -71.7
##  5 "I used to own~ Approximately 4~ Galla~ Mont~ Summer Repo~     45.8    -111. 
##  6 "Saw very larg~ One (1) mile fr~ Galla~ Mont~ Spring Repo~     45.6    -111. 
##  7 "I am an OTR t~ Heading westbou~ Miner~ Mont~ Spring Repo~     47.4    -116. 
##  8 "It has been a~ It was in Monta~ Misso~ Mont~ Summer Repo~     47.0    -114. 
##  9 "In mid july 2~ We live just in~ Misso~ Mont~ Summer Repo~     47.1    -114. 
## 10 "My family and~ 8.6 miles up Fo~ Misso~ Mont~ Summer Repo~     46.9    -114. 
## # ... with 712 more rows, and 20 more variables: date <date>, number <dbl>,
## #   classification <chr>, geohash <chr>, temperature_high <dbl>,
## #   temperature_mid <dbl>, temperature_low <dbl>, dew_point <dbl>,
## #   humidity <dbl>, cloud_cover <dbl>, moon_phase <dbl>,
## #   precip_intensity <dbl>, precip_probability <dbl>, precip_type <chr>,
## #   pressure <dbl>, summary <chr>, uv_index <dbl>, visibility <dbl>,
## #   wind_bearing <dbl>, wind_speed <dbl>
summary(bigfoot2c)
##    observed         location_details      county             state          
##  Length:722         Length:722         Length:722         Length:722        
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##                                                                             
##                                                                             
##                                                                             
##     season             title              latitude       longitude      
##  Length:722         Length:722         Min.   :25.14   Min.   :-149.77  
##  Class :character   Class :character   1st Qu.:36.89   1st Qu.:-111.76  
##  Mode  :character   Mode  :character   Median :40.42   Median : -87.25  
##                                        Mean   :40.07   Mean   : -94.35  
##                                        3rd Qu.:44.70   3rd Qu.: -81.49  
##                                        Max.   :64.89   Max.   : -68.23  
##       date                number      classification       geohash         
##  Min.   :1961-09-01   Min.   :   77   Length:722         Length:722        
##  1st Qu.:2002-10-02   1st Qu.: 9333   Class :character   Class :character  
##  Median :2007-10-22   Median :25792   Mode  :character   Mode  :character  
##  Mean   :2006-10-12   Mean   :30196                                        
##  3rd Qu.:2014-11-13   3rd Qu.:49880                                        
##  Max.   :2021-11-27   Max.   :71997                                        
##  temperature_high temperature_mid  temperature_low   dew_point    
##  Min.   : 9.80    Min.   : 8.595   Min.   : 0.09   Min.   :-1.83  
##  1st Qu.:49.60    1st Qu.:43.731   1st Qu.:36.26   1st Qu.:38.01  
##  Median :62.55    Median :55.585   Median :48.23   Median :47.91  
##  Mean   :62.84    Mean   :55.566   Mean   :48.29   Mean   :48.62  
##  3rd Qu.:78.22    3rd Qu.:69.285   3rd Qu.:61.36   3rd Qu.:62.72  
##  Max.   :98.15    Max.   :85.950   Max.   :84.34   Max.   :77.40  
##     humidity       cloud_cover       moon_phase     precip_intensity 
##  Min.   :0.0800   Min.   :0.0000   Min.   :0.0100   Min.   :0.00010  
##  1st Qu.:0.7400   1st Qu.:0.4100   1st Qu.:0.2500   1st Qu.:0.00070  
##  Median :0.8100   Median :0.7000   Median :0.5200   Median :0.00305  
##  Mean   :0.8003   Mean   :0.6419   Mean   :0.4987   Mean   :0.01036  
##  3rd Qu.:0.8800   3rd Qu.:0.9100   3rd Qu.:0.7600   3rd Qu.:0.01080  
##  Max.   :1.0000   Max.   :1.0000   Max.   :0.9900   Max.   :0.20580  
##  precip_probability precip_type           pressure        summary         
##  Min.   :0.010      Length:722         Min.   : 980.3   Length:722        
##  1st Qu.:0.500      Class :character   1st Qu.:1011.7   Class :character  
##  Median :0.950      Mode  :character   Median :1015.1   Mode  :character  
##  Mean   :0.744                         Mean   :1015.2                     
##  3rd Qu.:1.000                         3rd Qu.:1019.2                     
##  Max.   :1.000                         Max.   :1038.0                     
##     uv_index        visibility      wind_bearing     wind_speed    
##  Min.   : 0.000   Min.   : 0.740   Min.   :  0.0   Min.   : 0.100  
##  1st Qu.: 2.000   1st Qu.: 6.822   1st Qu.:134.0   1st Qu.: 1.502  
##  Median : 4.000   Median : 8.940   Median :204.5   Median : 3.420  
##  Mean   : 4.731   Mean   : 8.013   Mean   :199.1   Mean   : 4.024  
##  3rd Qu.: 7.000   3rd Qu.: 9.845   3rd Qu.:260.0   3rd Qu.: 5.630  
##  Max.   :12.000   Max.   :10.000   Max.   :359.0   Max.   :23.940
bigfoot2c <- bigfoot2c %>%
  mutate(year = as.numeric(format(date,'%Y')))
view(bigfoot2c)

How many bigfoot sightings has there been over the years?

bigfoot2c %>%
  ggplot(aes(year)) + 
  geom_histogram(color = "aquamarine4", fill = "aquamarine") +
  labs(x="year of sightings",
         y = "# of sightings",
         title = "Amount of bigfoot sightings")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

Map of sightings in U.S

bigfoot2c %>%
filter(state != "Alaska") %>%
  ggplot(aes(longitude,latitude, color = season)) +
  geom_point() +
  borders("state") + 
  coord_map() +
  labs(title = "Bigfoot Sightings in the U.S")

So what states was bigfoot seen?

bigfoot2c %>%
  count(state, sort = TRUE)
## # A tibble: 46 x 2
##    state             n
##    <chr>         <int>
##  1 Washington      115
##  2 Ohio             84
##  3 Florida          48
##  4 Illinois         47
##  5 Oregon           31
##  6 West Virginia    26
##  7 Alabama          23
##  8 Kentucky         22
##  9 Michigan         22
## 10 Georgia          20
## # ... with 36 more rows
WA <- bigfoot2c %>%
  filter(state == "Washington") %>%
  select(county,number,season,temperature_mid)
WA
## # A tibble: 115 x 4
##    county           number season temperature_mid
##    <chr>             <dbl> <chr>            <dbl>
##  1 Skamania County   65295 Winter            40.8
##  2 Skamania County   65464 Spring            48.5
##  3 Skamania County   67407 Fall              38.9
##  4 Klickitat County   5953 Fall              46.7
##  5 Klickitat County  23315 Spring            40.4
##  6 Klickitat County  35479 Fall              64.3
##  7 Lewis County       4737 Spring            57.6
##  8 Lewis County      22475 Summer            60.7
##  9 Lewis County      65388 Spring            44.8
## 10 Lewis County      65538 Spring            53.1
## # ... with 105 more rows

Where in WA was bigfoot seen?

attempt <- WA %>%
  count(county, sort = TRUE)
ggplot(attempt, aes(county,n)) +
  geom_point() +
  theme_minimal(base_size = 10)+
  theme(axis.text.x = element_text(size = 8, angle = 90)) +
  labs(title = "WA county sightings", x="counties",y = "# of sightings")

Which seasons did bigfoot appear?

d <- bigfoot2c %>%
  mutate(season = na_if(season, "Unknown")) %>%
  filter(!is.na(season)) %>%
  ggplot(aes(year, fill = season)) + 
  geom_bar() +
  facet_wrap(~season) +
  labs(x="Year",
         y = "# of sightings",
         title = "Seasonal Sightings") +
  theme(axis.text.x = element_text(size = 9, angle = 50))
d

ggplot(bigfoot2c, aes(x = 1, y = season, fill = season)) +
    geom_col() +
    coord_polar(theta='y') +
  theme_void() + 
  ggtitle("Seasons of bigfoot sightings")

Most common words to describe bigfoot observations?

wordcloud(words = bigfoot2c$observed, min.freq = 1,           max.words=1000, colors=brewer.pal(8, "BrBG"))
## Loading required namespace: tm
## Warning in tm_map.SimpleCorpus(corpus, tm::removePunctuation): transformation
## drops documents
## Warning in tm_map.SimpleCorpus(corpus, function(x) tm::removeWords(x,
## tm::stopwords())): transformation drops documents
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : something could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sounded could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : passed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : investigate could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : outside could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : daughter could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : taken could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : calls could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : saturday could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : encountered could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : national could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : people could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : couple could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : car could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : quiet could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : house could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : located could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : heavily could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : scream could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : standing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bridge could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : somewhere could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : print could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bright could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : east could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : talking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : camp could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : miles could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : logging could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : crossed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : startled could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : weather could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : was could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : several could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : ridge could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : described could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : south could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : truck could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : during could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : grabbed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : clear could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : make could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : stride could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : except could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hours could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sound could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sitting could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : talked could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hundred could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : game could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : then could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : might could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : grass could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : forget could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : keep could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : side could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : strong could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : stopped could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : year could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : asked could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : plus could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hill could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : found could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : about could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : riding could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : night could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : september could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : left could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : one could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : finally could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : also could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : today could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : heading could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : note could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : noises could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : shocked could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : actually could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : seeing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : shoulders could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : believe could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : tracks could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : noise could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bark could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : knock could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : swinging could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : drove could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : notice could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hands could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : anything could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : traveling could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : website could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : leave could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : like could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : investigator could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : suddenly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : footprint could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : clearly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : noticed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : reached could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : backyard could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : head could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : years could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : wife could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : goes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : long could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : watch could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : wood could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : nose could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : recording could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : took could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : location could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : again could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : front could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : slightly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : type could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : approximately could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : course could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : freaked could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : large could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : feet could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : end could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : assumed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : done could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : loud could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : houses could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : brother could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : name could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : taller could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : silent could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : clearing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : stayed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : screaming could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : saying could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : pushed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : moved could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : open could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : possibly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : pond could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : later could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : almost could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : whole could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : girlfriend could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : take could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : approached could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : equipment could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : shaking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : chest could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : steep could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : fence could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : there could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : driving could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : nearly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : she could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : buddy could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : experience could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : black could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : you could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : highway could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : school could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bedroom could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : waist could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : thinking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : porch could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : fresh could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : florida could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : spent could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : break could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : little could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : disappeared could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : starting could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : footsteps could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : washington could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : voice could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : moving could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : branch could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : human could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sounding could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : moment could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : short could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : massive could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : contact could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : used could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : yelled could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : boyfriend could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : campground could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : feeling could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : camera could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : moon could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : following could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : step could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : opposite could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : humanlike could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : early could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : much could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : mile could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : motion could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : friday could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : story could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : field could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : probably could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : laying could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : check could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : brought could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : stepped could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : describe could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : kept could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : finger could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : scared could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : legs could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : tree could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : place could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : reason could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : experienced could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bend could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : pretty could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : occurred could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : dusk could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : happening could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : definitely could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : caught could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : howling could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : doubt could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : power could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : minute could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : fully could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : footprints could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : slowly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : month could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : behind could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : chance could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : basically could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : but could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : muscular could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : country could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : main could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sounds could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : trying could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : encounters could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : looks could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : swamp could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : man could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : know could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : made could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : before could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : police could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : brown could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : valley could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : odor could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : months could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : perhaps could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : case could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : less could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : louder could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : changed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : literally could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : every could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : together could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : showed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : body could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : lights could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : looking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : middle could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : exactly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : easily could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : headed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : reported could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : since could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : october could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : once could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : wearing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : growl could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : coming could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : seems could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : must could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : ended could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : somewhat could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : else could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : although could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : ever could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : vehicle could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : start could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : creature could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : big could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : passing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : away could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : direction could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : tell could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : color could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : beyond could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : said could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : gave could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : inches could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : called could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hillside could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : three could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : series could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : however could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : believed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : spotted could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : slight could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hwy could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : they could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : someone could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : stared could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : pitch could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : jumped could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : quite could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : listened could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : far could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : mountains could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : winter could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : frightened could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : reading could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sleeping could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : appeared could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : last could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : normally could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sightings could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : new could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : west could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : wouldnt could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hiking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : traffic could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : fields could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : pasture could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : camping could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : everyone could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : feel could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : huge could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hunter could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sure could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : forth could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : driveway could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : waited could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : six could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : knocks could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : began could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : directly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : now could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : walking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : entered could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : want could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : encounter could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : soon could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : get could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : return could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : father could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : while could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : strides could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : convinced could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : angry could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : straight could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hit could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : thought could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : rolled could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : trip could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : calling could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : roads could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : track could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : roar could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : weird could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : late could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : seconds could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : witnessed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : running could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : knocking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : thru could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : august could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : event could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : due could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : heel could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : mom could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : trails could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : lot could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : woods could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : think could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : ahead could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : live could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : breathing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : closer could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : knees could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : slowed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : use could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : wooded could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : impression could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hunt could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : distance could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : stream could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : farm could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : lane could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : beach could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : limbs could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : past could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : makes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : stand could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : pine could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : campsite could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : backed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : staring could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : move could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : towards could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bank could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : followed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : water could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hell could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : facing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : mouth could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : summer could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : and could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : good could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : parallel could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : top could not be fit on page. It will not be plotted.

thurston <-bigfoot2c %>%
  filter(state == "Washington", county == "Thurston County") %>%
  select(observed)
thurston
## # A tibble: 2 x 1
##   observed                                                                      
##   <chr>                                                                         
## 1 This is how it all started i was walking home from my boyfriends house i woul~
## 2 On wed march 20,2012 My 2, sons J and T, and 2 friends S and T along with mys~