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(sf)
## Warning: package 'sf' was built under R version 4.1.3
## Linking to GEOS 3.10.2, GDAL 3.4.1, PROJ 7.2.1; sf_use_s2() is TRUE
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), ]
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)
WA <- bigfoot2c %>%
  filter(state == "Washington") %>%
  select(county,number,season,temperature_mid)
WA

#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, : figured 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, : wilderness 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, : september 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, : area 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, : season 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, : east could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : movement 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, : playing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : maybe 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, : washington could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : turned 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, : laying could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : matter could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : across could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : length could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hear could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : approaching 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, : kind 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, : slowly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : roughly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : this could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : animals 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, : home could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : different 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, : old could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : came could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : estimate 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, : dont could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sides could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : scare could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : quickly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : wasnt 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, : passing 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, : three could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hair 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, : moment could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : first 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, : body could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : trail could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : dark could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : state 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, : forest could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bird could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : still could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : next 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, : forth 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, : unusual could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : set could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : spot could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bigfoot 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, : months could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : arrived 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, : that 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, : high 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, : vocalizations could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : need 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, : somewhat could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : ohio could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : deck 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, : reached 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, : shortly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : onto 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, : moved could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : walked 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, : school 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, : hanging 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, : returned could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : great could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : vocalization 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, : made could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : form 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, : toward 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, : saying 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, : parallel 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, : fishing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : land 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, : feeling 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, : well could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : floor could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hoping could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : getting 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, : pine 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, : started could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : previous could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : call could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : heard 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, : saturday 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, : headed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : door could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bad could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : spring could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : trailer could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : find 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, : freaked could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : gravel could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : spooked could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bfro 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, : afraid could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : air could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : felt 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, : whatever could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : never could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : things 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, : startled could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : please 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, : jumped 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, : story 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, : today 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, : winter 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, : cant could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : couldnt 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, : quick could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hills 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, : contact could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : eventually could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : cold could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : already could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : watching could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : listen could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : 300 could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : ago could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : can could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : howl could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hunted could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : colored 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, : whole 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, : move could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : two could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : brush could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : windows could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : come 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, : pretty 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, : walking 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, : light 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, : living could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : cross 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, : stay could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : video 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, : seen 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, : encounter could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : continued 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, : bigger 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, : distinct could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : thrown 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, : pace could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : mine 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, : she 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, : view 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, : impression 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, : direction 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, : broken 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, : stump 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, : growling 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, : heavily could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : staying 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, : talked could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : 100 could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sign 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, : range 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, : sitting could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : fast could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : flat 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, : wide could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : curious could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : locked could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : earlier could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : telling could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : yes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : dogs 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, : way could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : farther 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, : bridge 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, : then could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hand 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, : stand could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : branches could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : after 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, : rolled 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, : feet 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, : decided 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, : hit could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : even could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : room 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, : immediately 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, : mile could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : using 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, : realized could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : awake could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : faint 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, : about could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : havent 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, : happen could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : being could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : yard could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : around 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, : acres could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : what 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, : mother could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : give 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, : once 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, : smelled could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : yds could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : certain could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : closest could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : general could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : green 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, : hike could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : yelling 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, : edge 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, : days could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : tall 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, : must could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : witness could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : loaded could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : everything 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, : smell 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, : believed 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, : wolf could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : dog could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : cow 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, : dry 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, : sounding 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, : ridge 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, : coyote could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : rural 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, : stayed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : wet could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : places could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : not could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : inside 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, : moose could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : the could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : creek 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, : hours could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : flashlight could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : worked 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, : without could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : upright could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : dropped could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : very could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : didn’t could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : evening 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, : mostly 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, : features could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : size 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, : rock could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : northwest could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sleep 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, : eyes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : shadow 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, : either could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : follow could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : going 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, : don’t could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : similar could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : put could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : nature could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : wrong could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : falling could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sasquatch 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, : approx could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : november could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : listening could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : anyone could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : corner 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, : break could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : didnt 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, : camping 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, : family could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : remember could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : agreed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : leaves could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : turning 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, : west 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, : mountain 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, : enough 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, : investigator 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, : river could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : life 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, : drove could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : ive could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : camped 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, : grew 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, : head could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : son 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, : froze 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, : stood could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : incident could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : frozen 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, : showed 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, : horse 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, : slight 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, : werent could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : saw could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : talk 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, : away could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : animal 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, : coyotes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : right could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : morning 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, : times could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : extremely 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, : when 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, : finger could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bear could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : ape could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sat could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : parked could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : breaking 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, : became 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, : travel could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : these 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, : middle 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, : hwy could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : evidence 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, : have could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : pass could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : barking 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, : log could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : guys 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, : checking 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, : girlfriend 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, : recordings 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, : behind 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, : ground could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : meadow 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, : bottom 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, : toe could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : dense could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : howls 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, : howling 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, : black 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, : time could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : watched could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sight could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : low could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : heavy could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : familiar could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : wildlife 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, : town 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, : wood could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : say could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : understand could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : weekend could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : waiting could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hitting could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : lasted 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, : roar could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : possible could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : explain 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, : best could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : pictures could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : gun 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, : breathing 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, : hearing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : odd 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, : local could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : just 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, : woman could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : rocks 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, : driving could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : known 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, : start could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : thats 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, : see could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : details could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : his 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, : street 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, : side 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, : friday 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, : ever could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : small could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : boat could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : afternoon could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : drive 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, : chance could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : attention 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, : long could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : guess could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : minutes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : route could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : figure 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, : deep could not be fit on page. It will not be plotted.