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")

#What season 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, "Pastel1"),backgroundColor="black")
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : property could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : none could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : cabin could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : particular could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : seemed could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : thing could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : really could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : week could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : husband could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : apart could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : site could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : rather could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : fours could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : dad could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : steps could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : uncle could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : recently could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : observed could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : interesting could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : shape could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : least could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hollow could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : throwing could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : completely could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : many could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : nice could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : nights could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : lives could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : point could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : part could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : line could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : seem could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : forward could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sudden could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : knew could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : back could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : mind could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : warm could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : wasn’t could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : day could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : section could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : parking could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : tent could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : ravine could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hard could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : deep could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : birds could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : couldn’t could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : guy could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : upon could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : four could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : picture could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : exact could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : mid could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : got could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : daylight could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : looked could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : raining could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : normal could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : larger could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : work could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : avid could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : will could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : woke could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : kids could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : says could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : may could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sort could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : turn could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : county could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : cleared could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : recall could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bed could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : report could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : gear could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : working could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : closed could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hunting could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : silence could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : wild could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : making could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bipedal could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : dead could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : north could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : friend could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : taking could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sunday could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : rest could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : real could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : july could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : phone could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : tone could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : ten could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : quarter could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : within could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : along could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : halfway could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : deer could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : anyway could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : person could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : cars could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sighting could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : fire could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : reports could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : lake could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : city could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : mph could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : from could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sister could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : out could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : second could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : read could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : were could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : prints could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : slow could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : weeks could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : top could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : all could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : base could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : screams could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : sense could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : some could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : arms could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : doors could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : pitched could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : threw could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : face could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : cut could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : jump could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : led could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : midnight could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : bushes could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : laughed could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : stated could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : tried could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : wind could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : areas could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : position could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : visible could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : window could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : white could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : close could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : stuff could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : fell could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : pulled could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : told could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : speed could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : pick could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : fear could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : hiked could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in text.default(x1, y1, words[i], cex = size[i], offset = 0, srt =
## rotWord * : "backgroundColor" is not a graphical parameter
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : creatures could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : neck could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : happened could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : lived could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : subject could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : picked could not be fit on page. It will not be plotted.
## Warning in strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## 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 strwidth(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in strheight(words[i], cex = size[i], ...): "backgroundColor" is not a
## graphical parameter
## Warning in wordcloud(words = bigfoot2c$observed, min.freq = 1, max.words =
## 1000, : figured could not be fit on page. It will not be plotted.