Adjusted Closing Prices (Overlap)

Column

Adjusted Closing Prices for Amaon, Facebook, Netflix and Tesla

Total Volumes

Column

Trading Volumns for Amaon, Facebook, Netflix and Tesla

Conclusion

Column

Summary

We analyzed over 2 years of financial data for 4 companies- Google, Apple, Tesla and Netflix.The data was downloaded from Yahoo Finance from January 2018 to Mar 2020.

This first tab Adjusted Closing Prices (Overlap) provides a graphical representation closing stock prices of all the 4 companies. The second tab (Total Volume) compares the trends in trading volumes of all the 4 companies. In the third tab, we will discuss the conclusion

Tesla’s stock prices have risen significantly Nov 2019 and it become to volatile after the Feb 2020.

Google’s Stock is a relatively save options, because we can see an overall upward trend since Jun 2019.

For the Netflix and Apple, the stock keep fluctating with a slighting upward trend over the past two years.

From my perspective, the downstream of all those 4 stock after the turn of Feb 21 is a good opportunity to buy in. Espectially for Tesla.

---
title: "ANLY 512 Lab 1 - Dashboards"
author: "JIANWEI LI"
date: "3/12/2020"
output:
  flexdashboard::flex_dashboard:
    orientation: rows
    social: menu
    source_code: embed
    vertical_layout: fill
  html_document:
    df_print: paged
---



```{r setup, include=FALSE}
chooseCRANmirror(graphics=FALSE, ind=1)


library(flexdashboard)

library(dygraphs)
library(xts)
library(tidyquant)
library(pdfetch)

stocklist <- c("GOOG", "AAPL", "TSLA", "NFLX")


```



Adjusted Closing Prices (Overlap)
=====================================

Column {.tabset data-height=550}
-----------------------------------------------------------------------

### Adjusted Closing Prices for Amaon, Facebook, Netflix and Tesla

```{r}

overlap <- pdfetch_YAHOO(stocklist, fields = c("open","adjclose"), from = as.Date("2018-01-01"), interval = "1d")

close<- cbind(overlap$GOOG.adjclose,
              overlap$AAPL.adjclose,
              overlap$TSLA.adjclose,
              overlap$NFLX.adjclose)
colnames(close)<- c("GOOG","AAPL","TSLA","NFLX")

# plot
dygraph(close,
        main = "Closing Price",
        ylab = "Stock Closing Price",
        group = "xxx") %>%
    dyOptions(strokeWidth = 1,colors = RColorBrewer::brewer.pal(4, "Set3"))%>%
dyHighlight(highlightCircleSize = 3, 
              highlightSeriesBackgroundAlpha = 0.4,
              hideOnMouseOut = TRUE)%>%
dyLegend(width = 400) %>%
dyRangeSelector()

```

Total Volumes
=====================================

Column {.tabset data-height=550}
-----------------------------------------------------------------------
### Trading Volumns for Amaon, Facebook, Netflix and Tesla

```{r}

overlap_Volume <- pdfetch_YAHOO(stocklist, fields = c("volume"), from = as.Date("2018-01-01"), interval = "1d")

close<- cbind(overlap$GOOG.volume,
              overlap$AAPL.volume,
              overlap$TSLA.volume,
              overlap$NFLX.volume)
colnames(overlap_Volume)<- c("GOOG","AAPL","TSLA","NFLX")

# plot
dygraph(overlap_Volume,
        main = "Closing Price",
        ylab = "Stock Closing Price",
        group = "xxx") %>%
    dyOptions(strokeWidth = 1,colors = RColorBrewer::brewer.pal(4, "Set3"))%>%
dyHighlight(highlightCircleSize = 3, 
              highlightSeriesBackgroundAlpha = 0.2,
              hideOnMouseOut = TRUE)%>%
dyLegend(width = 400) %>%
dyRangeSelector()


```


Conclusion 
=====================================


Column {data-width=600}
-------------------------------------

### Summary

We analyzed over 2 years of financial data  for 4 companies- Google, Apple, Tesla and Netflix.The data was downloaded from Yahoo Finance  from January 2018 to Mar 2020.

This first tab Adjusted Closing Prices (Overlap) provides a graphical representation  closing stock prices of all the 4 companies. The second tab (Total Volume) compares the trends in trading volumes of all the 4 companies. In the third tab, we will discuss the conclusion



Tesla's stock prices have risen significantly Nov 2019 and it become to volatile after the Feb 2020.

Google's Stock is a relatively save options, because we can see an overall upward trend since Jun 2019.

For the Netflix and Apple, the stock keep fluctating with a slighting upward trend over the past two years.

From my perspective, the downstream of all those 4 stock after the turn of Feb 21 is a good opportunity to buy in. Espectially for Tesla.