Loading necessary packages
Setup
library(tinytex)
## Warning: package 'tinytex' was built under R version 4.0.5
library(tidyverse)
## Warning: package 'tidyverse' was built under R version 4.0.5
## -- Attaching packages --------------------------------------- tidyverse 1.3.0 --
## v ggplot2 3.3.3 v purrr 0.3.4
## v tibble 3.1.0 v dplyr 1.0.5
## v tidyr 1.1.3 v stringr 1.4.0
## v readr 1.4.0 v forcats 0.5.1
## Warning: package 'tibble' was built under R version 4.0.5
## Warning: package 'tidyr' was built under R version 4.0.5
## Warning: package 'dplyr' was built under R version 4.0.5
## Warning: package 'forcats' was built under R version 4.0.5
## -- Conflicts ------------------------------------------ tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag() masks stats::lag()
library(pdftools)
## Using poppler version 0.73.0
library(rtweet)
## Warning: package 'rtweet' was built under R version 4.0.5
##
## Attaching package: 'rtweet'
## The following object is masked from 'package:purrr':
##
## flatten
library(Quandl)
## Loading required package: xts
## Warning: package 'xts' was built under R version 4.0.5
## Loading required package: zoo
## Warning: package 'zoo' was built under R version 4.0.5
##
## Attaching package: 'zoo'
## The following objects are masked from 'package:base':
##
## as.Date, as.Date.numeric
##
## Attaching package: 'xts'
## The following objects are masked from 'package:dplyr':
##
## first, last
library(quantmod)
## Warning: package 'quantmod' was built under R version 4.0.5
## Loading required package: TTR
## Warning: package 'TTR' was built under R version 4.0.5
## Registered S3 method overwritten by 'quantmod':
## method from
## as.zoo.data.frame zoo
Guestroom Rental Luxury Resort
guestroom_rental_luxury_resort %>%
filter(Date > "2018-04-13")%>%
ggplot(aes(x = Date, y = Value))+
geom_point()+
geom_smooth(method = "gam")+
ggtitle(label = "Guestroom Rental", subtitle = "Luxury Resorts, no Casino Hotels")
## `geom_smooth()` using formula 'y ~ s(x, bs = "cs")'
Producer Price Index by Industry: Hotels and Motels, Except Casino Hotels: Guestroom Rental
guestroom_rental_hotels_motels <- Quandl("FRED/PCU7211107211101", api_key="pP6rU_xxGhz4rByVmBPY")
guestroom_rental_hotels_motels %>%
filter(Date > "2018-04-13")%>%
ggplot(aes(x = Date, y = Value))+
geom_point()+
geom_smooth(method = "gam")+
ggtitle(label = "Hotel / Motel Guestroom Rental", subtitle = "Hotels and Motels, Except Casino Hotels")
## `geom_smooth()` using formula 'y ~ s(x, bs = "cs")'
Producer Price Index by Industry: Casino Hotels: Casino Hotel Guestroom Rental
guestroom_rental_casino_hotel <- Quandl("FRED/PCU7211207211201", api_key="pP6rU_xxGhz4rByVmBPY")
guestroom_rental_casino_hotel %>%
filter(Date > "2018-04-13")%>%
ggplot(aes(x = Date, y = Value))+
geom_point()+
geom_smooth(method = "gam")+
ggtitle(label = "Casino Hotel Guestroom Rental", subtitle = "Producer Price Index by Industry: Casino Hotels")
## `geom_smooth()` using formula 'y ~ s(x, bs = "cs")'
#Producer Price Index by Industry: Golf Courses and Country Clubs: Membership Dues and Fees
golf_courses_country_clubs_membership_dues_fees <- Quandl("FRED/PCU7139107139101", api_key="pP6rU_xxGhz4rByVmBPY")
golf_courses_country_clubs_membership_dues_fees %>%
filter(Date > "2018-04-13")%>%
ggplot(aes(x = Date, y = Value))+
geom_jitter()+
geom_smooth(method = "gam")+
ggtitle(label = "Golf Courses and Country Clubs", subtitle = "Membership Fees and Dues")
## `geom_smooth()` using formula 'y ~ s(x, bs = "cs")'
Producer Price Index by Industry: Golf Courses and Country Clubs: Greens and Guest Fees
golf_courses_country_clubs_greens_and_guest_fees <- Quandl("FRED/PCU7139107139102", api_key="pP6rU_xxGhz4rByVmBPY")
golf_courses_country_clubs_greens_and_guest_fees %>%
filter(Date > "2018-04-13")%>%
ggplot(aes(x = Date, y = Value))+
geom_point()+
geom_smooth(method = "gam")+
ggtitle(label = "Golf Courses and Country Clubs", subtitle = "Greens Fees and Guest Fees")
## `geom_smooth()` using formula 'y ~ s(x, bs = "cs")'
Now, this analysis will continue, incorporating twitter social media data to help us better understand potential market opportunities for FacilityONE in hotel industry, golf course / resort industry, manufacturing, nursing homes, retirement communities (The Villages, FL), and manufacturing.