Garden Grove, CA
Inventory Measure (Public) ZILLOW/C161_IMP
Median Listing Price - All Homes ZILLOW/C161_MLPAH
Median Rental - All Homes ZILLOW/C161_MRPAH
Price To Rent Ratio - All Homes ZILLOW/C161_PRRAH
Median Rental Price - Three Bedrooms ZILLOW/C161_MRP3B
Median Listing Price - Three Bedrooms ZILLOW/C161_MLP3B
indicator <- Quandl("ZILLOW/C161_IMP", type="zoo",start_date="2010-01-01", end_date="2020-08-10")
indicator1 <- as.data.frame(indicator)
indicator1$date <- row.names(indicator1)
autoplot(indicator, main = "Listing Inventory in GARDEN GROVE, CA",ts.colour = "darkgreen")+
labs(x="Time", y="Count", caption="Source: Zillow",
subtitle = str_glue("From {min(indicator1$date)} through {max(indicator1$date)}"),
title="Listing Inventory in GARDEN GROVE, CA")
## Warning: Ignoring unknown parameters: ts.colour

indicator <- Quandl("ZILLOW/C161_MLPAH", type="zoo",start_date="2015-01-01", end_date="2020-08-10")
indicator1 <- as.data.frame(indicator)
indicator1$date <- row.names(indicator1)
autoplot(indicator,ts.colour = "blue4") +
labs(x="Time", y="Price", caption="Source: Zillow",
subtitle = str_glue("From {min(indicator1$date)} through {max(indicator1$date)}"),
title="Median Listing Price in GARDEN GROVE, CA")
## Warning: Ignoring unknown parameters: ts.colour

indicator <- Quandl("ZILLOW/C161_MRPAH", type="zoo",start_date="2015-01-01", end_date="2020-08-10")
indicator1 <- as.data.frame(indicator)
indicator1$date <- row.names(indicator1)
autoplot(indicator,ts.colour = "darkred") +
labs(x="Time", y="Ratio", caption="Source: Zillow",
subtitle = str_glue("From {min(indicator1$date)} through {max(indicator1$date)}"),
title="Median Rental in GARDEN GROVE, CA")
## Warning: Ignoring unknown parameters: ts.colour

indicator <- Quandl("ZILLOW/C161_PRRAH", type="zoo",start_date="2015-01-01", end_date="2020-08-10")
indicator1 <- as.data.frame(indicator)
indicator1$date <- row.names(indicator1)
autoplot(indicator,ts.colour = "brown4") +
labs(x="Time", y="Ratio", caption="Source: Zillow",
subtitle = str_glue("From {min(indicator1$date)} through {max(indicator1$date)}"),
title="Price to Rent Ratio in GARDEN GROVE, CA")
## Warning: Ignoring unknown parameters: ts.colour

indicator <- Quandl("ZILLOW/C161_MLP3B", type="zoo",start_date="2010-01-01", end_date="2020-08-10")
indicator1 <- as.data.frame(indicator)
indicator1$date <- row.names(indicator1)
autoplot(indicator, main = "Listing Inventory in GARDEN GROVE, CA",ts.colour = "maroon")+
labs(x="Time", y="Price", caption="Source: Zillow",
subtitle = str_glue("From {min(indicator1$date)} through {max(indicator1$date)}"),
title="Median Listing Price - Three Bedrooms in GARDEN GROVE, CA")
## Warning: Ignoring unknown parameters: ts.colour

indicator <- Quandl("ZILLOW/C161_MRP3B", type="zoo",start_date="2015-01-01", end_date="2020-08-10")
indicator1 <- as.data.frame(indicator)
indicator1$date <- row.names(indicator1)
autoplot(indicator,ts.colour = "cyan4") +
labs(x="Time", y="Ratio", caption="Source: Zillow",
subtitle = str_glue("From {min(indicator1$date)} through {max(indicator1$date)}"),
title="Median Rental - Three Bedrooms in GARDEN GROVE, CA")
## Warning: Ignoring unknown parameters: ts.colour
