# Load packages
# Core
library(tidyverse)
library(tidyquant)
Visualize and compare skewness of your portfolio and its assets.
Choose your stocks.
from 2012-12-31 to 2017-12-31
symbols <- c("JNJ", "UNH", "HD", "GOOG", "NVDA")
prices <- tq_get(x = symbols,
get = "stock.prices",
from = "2012-12-31",
to = "2017-12-31")
asset_returns_tbl <- prices %>%
group_by(symbol) %>%
tq_transmute(select = adjusted,
mutate_fun = periodReturn,
period = "monthly",
type = "log") %>%
slice(-1) %>%
ungroup() %>%
set_names(c("asset", "date", "returns"))
# symbols
symbols <- asset_returns_tbl %>% distinct(asset) %>% pull()
symbols
## [1] "GOOG" "HD" "JNJ" "NVDA" "UNH"
# weights
weights <- c(0.2, 0.2, 0.2, 0.2, 0.2)
weights
## [1] 0.2 0.2 0.2 0.2 0.2
w_tbl <- tibble(symbols, weights)
w_tbl
## # A tibble: 5 × 2
## symbols weights
## <chr> <dbl>
## 1 GOOG 0.2
## 2 HD 0.2
## 3 JNJ 0.2
## 4 NVDA 0.2
## 5 UNH 0.2
# ?tq_portfolio
portfolio_returns_tbl <- asset_returns_tbl %>%
tq_portfolio(assets_col = asset,
returns_col = returns,
weights = w_tbl,
rebalance_on = "months",
col_rename = "returns")
portfolio_returns_tbl
## # A tibble: 60 × 2
## date returns
## <date> <dbl>
## 1 2013-01-31 0.0431
## 2 2013-02-28 0.0250
## 3 2013-03-28 0.0338
## 4 2013-04-30 0.0498
## 5 2013-05-31 0.0437
## 6 2013-06-28 0.00773
## 7 2013-07-31 0.0497
## 8 2013-08-30 -0.0333
## 9 2013-09-30 0.0231
## 10 2013-10-31 0.0366
## # … with 50 more rows
portfolio_returns_tbl %>%
tq_performance(Ra = returns,
Rb = NULL,
performance_fun = table.Stats) %>%
select(Skewness)
## # A tibble: 1 × 1
## Skewness
## <dbl>
## 1 0.218
# Figure 5.6 Asset and portfolio skewness comparison ----
asset_returns_skew_tbl <- asset_returns_tbl %>%
# skewness for each asset
group_by(asset) %>%
summarise(skew = skewness(returns)) %>%
ungroup() %>%
# skewness of portfolio
add_row(tibble(asset = "Portfolio",
skew = skewness(portfolio_returns_tbl$returns)))
asset_returns_skew_tbl %>%
ggplot(aes(asset, skew, color = asset)) +
geom_point() +
# Add label for portfolio
ggrepel::geom_text_repel(aes(label = asset),
data = asset_returns_skew_tbl %>%
filter(asset == "Portfolio"),
size = 5,
show.legend = FALSE) +
labs(y = "skewness")
Is any asset in your portfolio more likely to return extreme positive returns than your portfolio collectively? Discuss in terms of skewness. You may also refer to the distribution of returns you plotted in Code along 4.
Yes, both GOOG and NVDA are more likely to return extreme positive returns because they are the most positively skewed, in addition to those two HD is also positively skewed but less than the portfolio as a whole.