Loading necessary packages
Setup
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 = "Room Prices Luxury Resort", subtitle = "")
## `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")'
## Callaway
ely <- getSymbols("ELY")
## 'getSymbols' currently uses auto.assign=TRUE by default, but will
## use auto.assign=FALSE in 0.5-0. You will still be able to use
## 'loadSymbols' to automatically load data. getOption("getSymbols.env")
## and getOption("getSymbols.auto.assign") will still be checked for
## alternate defaults.
##
## This message is shown once per session and may be disabled by setting
## options("getSymbols.warning4.0"=FALSE). See ?getSymbols for details.
plot(ELY$ELY.Adjusted)
library(quantmod)
mar <- getSymbols("MAR")
Quandl_to_plotly <- function(dat){
p <- ggplot(dat, aes(x=Date, y=Value)) +
geom_point(shape=1)+
ggtitle("fred 2005 - 2021")
ggplotly(p)
}
greensfees <- golf_courses_country_clubs_greens_and_guest_fees
memberdues <- golf_courses_country_clubs_membership_dues_fees
Quandl_to_plotly(guestroom_rental_hotels_motels)