Original Data and Code Access

Results in this file are upon expanding the universe to include NYSE, NASDAQ and AMEX (per the AE comments). And here you can access the results with only the NYSE universe.

Size-Operating profitability portfolios are formed based on the NYSE, NASDAQ and AMEX.

Further improvement: + Change the risk-free rate data to the ones compatible with different frequency requirements.

Data cleaning and Preparation

Information about initial coding setup:

  1. freq sets the data frequency for the following analysis, 12 for monthly data, 4 for quarterly data and 1 for annual data.
  2. start.ym gives the earliest reasonable starting point of the series, which is January 1966, based on the available number of firms in the data set.
  3. After the preliminary data cleaning, port_market is the market portfolio data (including NYSE, NASDAQ and AMEX), ports_all contains different deciles. All the data are stored in the file named as market.names and data.names. I’ve finished creating the measures based on characteristic deciles, so I’ll have a close look at your results shortly. The decile data is attached. As mentioned, these are based on a single characteristic sort, which will hopefully provide new insight into characteristic based predictability. The characteristics are as follows:
  1. RF denotes the risk-free rate, which is the average of the bid and ask.
# 0. record datasets ----
## 0.1 initial value setup ----
freq = 12 # the frequency of the data <- 12 for monthly; 4 for quarterly; 1 for annually
start.ym = as.yearmon(1966) # the starting time

month_select <- function(freq = freq) { # return the months for differnt time frequency
  if (freq == 12) {
    return(c("January", "February", "March", "April", "May", "June", "July", "August", "September", "October", "November","December"))
  }
  if (freq == 4) {
    return(c("March", "June", "September", "December"))
  }
  if (freq == 1) {
    return("December")
  }
}
freq_name <- function(freq = freq) {
  if (freq == 12) {
    return("monthly")
  }
  if (freq == 4) {
    return("quarterly")
  }
  if (freq == 1) {
    return("annual")
  }
}

## 0.2 preliminary data cleaning ----
port_market <- read.csv("Allfirms_comp2.csv") %>%
  as.tbl() %>%
  # mutate(E = rollmeanr(E, k = 12, fill = NA_real_)) %>%
  mutate(month = as.yearmon(as.Date(date)),
         vwret = rollsumr(vwret, k = 12/freq, fill = NA)) %>%
  filter(months(month) %in% month_select(freq = freq))
write.csv(x = port_market, file = "market_Allfirms.csv")

ports_all <- read.csv("terciles_sz3.csv") %>%
  as.tbl() %>%
  mutate(month = as.yearmon(as.Date(jdate)), # (, format = "%d/%m/%Y")
         port = as.character(port))
ports <- unique(ports_all$port) # identifiers for portfolios
for (p in ports) {
  ports.dt <- ports_all %>%
    filter(port == p) %>%
    arrange(month) %>%
    # mutate(vwret = rollsumr(vwret, k = 12/freq, fill = NA)) %>%
    filter(months(month) %in% month_select(freq = freq)) # %>%
    # mutate(E = rollmeanr(E, k = 12, fill = NA_real_))
  ports.dt <- ports.dt[, -1]
  write.csv(x = ports.dt, file = paste("port_", p, ".csv", sep = ""))
}

## 0.3 name portfolios and predictors ----
market.names <- list.files(pattern = "market_")
data.names <- list.files(pattern = "port_") # paste("port_", "D", 1:10, ".csv", sep = "") # data for portfolios
id.names <- c("Market", "B", "M", "S") # c("Market", paste("D", 1:10, sep = "")) # set plot names # c("Market", "B", "M", "S") # c("Market", "H", "M", "L") # c("Market", "W", "N", "L")
ratio_names <- c("DP", "PE", "EY", "DY", "Payout") # potential predictors

## 0.4 risk-free rate
RF <- read.csv("Rfree_t30.csv") %>% # record the risk free rate
  as.tbl() %>% # as the average of the bid and ask.
  select(-X) %>%
  mutate(month = as.yearmon(month)) %>%
  filter(months(month) %in% month_select(freq = freq)) %>%
  filter(month >= start.ym)

Notes: Seems that the big-value and small-growth portfolios include less firms comparing the other four characteristic portfolios, around half of them.

Figure 1 - Log Cumulative Index

Log cumulative realised portfolio return components for seven portfolios - the market portfolio and six size and book-to-market equity ratio sorted portfolios. All following figures decmonstrate the monthly realised price-earnings ratio growth (gm), earnings growth (ge), dividend-price (dp) and the portfolio return index (r) with the values in January 1966 as zero for all portfolios.

# TABLE-1. summary statistics ----
TABLE1.uni <- list() # the univariate statistics
TABLE1.cor <- list() # the correlation matrixs

PE.df <- data.frame(month = port_market$month[port_market$month >= start.ym])
EY.df <- data.frame(month = port_market$month[port_market$month >= start.ym])
DP.df <- data.frame(month = port_market$month[port_market$month >= start.ym])

## (1*) summary tables for Summary & Correlations ----
c <- 0
for (id in c(market.names, data.names)) {
  c <- c + 1
  # print(id); print(id.names[c])
  
  ## 1. read the data ----
  data_nyse <- read.csv(id) %>%
    as.tbl() %>%
    mutate(month = as.yearmon(month)) %>%
    filter(month >= start.ym) %>% # start from "Jan 1966"
    select(month, r = vwret, P, E, D) %>%
    mutate(DP = D / P, # these are adjusted by the log transformation
           PE = P / E,
           EP = E / P,
           EY = E / lag(P), # earnings yield
           DY = D / lag(P), # dividend yield
           Payout = D / E) # payout ratios
  
  PE.df <- cbind.data.frame(PE.df, data_nyse$PE)
  EY.df <- cbind.data.frame(EY.df, data_nyse$EY)
  DP.df <- cbind.data.frame(DP.df, data_nyse$DP)
  
  ## 2. return decomposition ----
  data_decompose <- data_nyse %>%
    mutate(r = r, # cts returns = log total returns
           gm = log(PE) - lag(log(PE)), # multiple expansion rate
           ge = log(E) - lag(log(E)), # earnings growth rate
           dp = log(1 + DP/freq)) %>% # only 1/12 of the dividends
    na.omit()
  
  ## 3. summary-Stat ----
  ar1.coef <- function(x) {
    return(as.numeric(lm(x ~ lag(x))$coefficients[2]))
  } # return the function value of the coefficient for the AR(1) model
  
  comp_summary.dt <- data_decompose %>%
    select(gm, ge, dp, r) %>%
    describe() %>%
    mutate(mean = mean * 100,
           sd = sd * 100,
           median = median * 100,
           min = min * 100,
           max = max * 100) %>%
    select(Mean = mean, Median = median, SD = sd, Min = min, Max = max, Skew = skew, Kurt = kurtosis) %>%
    round(digits = 4)
  
  comp_summary.dt$"AR(1)" <- data_decompose %>%
    select(gm, ge, dp, r) %>%
    apply(2, ar1.coef) %>%
    round(digits = 4)
  
  ### Store the summary stat
  # print(paste("Data starts from ", first(data_decompose$month), " and ends in ", last(data_decompose$month), ".", sep = ""))
  TABLE1.uni[[id.names[c]]] <- comp_summary.dt
  
  ## 4. correlations ----
  comp_cor <- data_decompose %>% select(gm, ge, dp, r) %>% cor()
  TABLE1.cor[[id.names[c]]] <- comp_cor
  
  # Figure-1. cumulative realised return components ---- 
  # jpeg(filename = paste("Figure1_", id.names[c], ".jpeg", sep = ""), width = 550, height = 350)
  par(mar = c(2, 4, 2, 1))
  cum_components.ts <- data_decompose %>%
    select(r, gm, ge, dp) %>%
    apply(2, cumsum) %>%
    ts(start = data_decompose$month[1], frequency = freq)
  plot.ts(cum_components.ts, plot.type = "single", lty = 1:4, main = id.names[c], cex.main = 1, 
          xlab = NULL, ylab = "Cumulative Return and Components Indices")
  legend("topleft",
         legend = c("Total return", "Price earnings growth",
                    "Earnings growth", "Dividend price"),
         lty = 1:4,
         cex = 1.0) # text size
  # dev.off()
  par(mar = c(5, 4, 4, 2) + 0.1)
}

write.csv(TABLE1.uni, file = "table_1.uni.csv")
write.csv(TABLE1.cor, file = "table_1.cor.csv")

.

Table 1 - Summary statistics of returns components

The correlations between gm and ge might be a bit too high comparing to Ferreira and Santa-Clara (2011). Need to check the code again.

Need to go back to the construction process of Prof Robert Shiller’s CAPE.

‘kable’ for Table Creation

Table 1 - Summary statistics of returns components
monthly data starts from Jun 1967 and ends in Dec 2019.
Panel A: univariate statistics Panel B: Correlations
Mean Median SD Min Max Skew Kurt AR(1) gm ge dp r
Market
gm 0.02 -0.03 3.12 -15.26 13.28 -0.19 4.42 0.92 1.00 -0.51 -0.03 0.07
ge 0.76 1.11 5.34 -22.01 19.34 -0.50 2.44 0.33 -0.51 1.00 -0.03 0.81
dp 0.28 0.27 0.09 0.09 0.50 0.14 -0.70 0.98 -0.03 -0.03 1.00 -0.03
r 0.94 1.25 4.43 -22.48 16.58 -0.51 1.85 0.05 0.07 0.81 -0.03 1.00
B
gm -0.11 -0.06 3.45 -20.91 12.86 -0.94 6.01 0.89 1.00 -0.59 -0.04 0.06
ge 0.76 1.04 5.40 -21.79 22.31 -0.16 2.64 0.39 -0.59 1.00 -0.02 0.77
dp 0.26 0.24 0.10 0.08 0.55 0.51 -0.60 0.99 -0.04 -0.02 1.00 -0.03
r 0.90 1.20 4.31 -20.61 17.97 -0.40 1.71 0.02 0.06 0.77 -0.03 1.00
M
gm -0.18 -0.22 3.51 -19.87 14.70 -0.44 5.51 0.90 1.00 -0.50 -0.05 0.06
ge 1.17 1.09 6.25 -27.89 24.28 -0.40 2.55 0.36 -0.50 1.00 -0.04 0.83
dp 0.29 0.26 0.15 0.09 0.93 1.53 2.80 0.98 -0.05 -0.04 1.00 -0.05
r 1.07 1.38 5.31 -27.07 22.97 -0.52 2.24 0.10 0.06 0.83 -0.05 1.00
S
gm -0.21 -0.23 3.58 -18.36 17.96 0.19 5.56 0.89 1.00 -0.44 0.00 0.06
ge 1.44 1.52 7.08 -32.02 27.76 -0.41 2.58 0.35 -0.44 1.00 -0.03 0.86
dp 0.72 0.35 0.93 0.13 5.26 2.42 5.22 1.00 0.00 -0.03 1.00 -0.04
r 1.12 1.36 6.21 -30.18 28.29 -0.31 2.29 0.15 0.06 0.86 -0.04 1.00
Note: Panel A in this table presents mean, median, standard deviation (SD), minimum, maximum, skewness (Skew), kurtosis (kurt) and first-order autocorrelation coefficient of the realised components of stock market returns and six size and book-to-market equity ratio sorted portfolios. These univariate statistics for each portfolios are presented separately. gm is the continuously compounded growth rate in the price-earnings ratio. ge is the continuously compounded growth rate in earnings. dp is the log of one plus the dividend-price ratio. *r* is the portfolio returns. Panel B in this table reports correlation matrices for all seven portfolios. The sample period starts from Feburary 1966 and ends in December 2019.

Figure 3 - Cumulative OOS R-sqaure Difference and Cumulative SSE Difference

The cumulative OOS R-square figures show the out-of-sample cumulative R-square up to each month from predictive regressions with listed predictors and from the sum-of-the-parts (SOP) method for each portfolio. The cumulative SSE difference plots indicates the out-of-sample performance of each model. These are evaluated by the cumulative squared prediction errors of the NULL minus the cumulative squared predictirion error of the ALTERNATIVE. The NULL model is the historical mean model, while the ALTERNATIVE model is either the predictive regression model or the SOP model. An incresae in the line suggests better performance of the ALTERNATIVE model and a decrease suggests that the NULL model is better.

Several points to note in the coding:

  1. The dividend-price ratio (‘DP’ hereafter) is calculated as the log of 1 plus the frequency-adjusted dividend to price ratio, rather than using the annual dividend. As by this return decomposition, the expected amount of dividend payout in each period should be adjusted by the frequency of the data in the analysis. \[ dp_t = \log (1 + \frac{\tilde{D}_t}{P_t}) = \log (1 + \frac{D_t / n}{P_t}) \text{,} \] where \(D_t\) is the annual dividend payment and \(n\) is the data frequency (e.g. \(n = 1\) for annual data and \(n = 12\) for monthly data) and \(\tilde{D}_t\) is the freqency-adjusted dividend payment for period \(t\).

  2. The SOP method by Ferreira and Santa-Clara (2011) decomposes the portfolio return into three components, namely the earnings growth, the prie multiple expansion and the next period dividend-price ratio. Here to generate the SOP prediction, we use the rolling mean of past earnings growth as the expected growth of the next period (denoted as ge1). However, there are other choices, such as recursive means in ge2 and ge3.

  3. critica.value = TRUE is the option whether to use boostrap method to calculate the MSE-F critical values. This is used in function Boot_MSE.F.

  4. The authors should evaluate the significance of the MSE−F statistic by using the theoret- ical distribution derived in McCracken (2007). The bootstrap-based inference (presented in Pages 9-10) can represent a robustness check and moved to an appendix. Further- more, the authors can also include in the main results the related out-of-sample statistic proposed by Clark and West (2007), which follows a standard Normal distribution. Therefore, readjust the Boot_MSE.F function.

  5. Column McCracken in Table 2 (line 604) gives the significance of the out-of-sample \(MSE–F\) statistic of McCracken (2007). \(***\), \(**\), and \(*\) denote significance at the 1%, 5%, and 10% level, respectively. Please refer to the Table 4 on P749 in McCracken (2007) with \(k_2 = 1\) and \(\pi = P/R = \frac{\text{Number of out-of-sample forecasts}}{\text{Number of observations used to form the first forecast}} = 1.6\).

## [1] "market_Allfirms.csv"
## [1] "Market"
## ##------ Tue May 24 11:03:44 2022 ------##
## Note: Using an external vector in selections is ambiguous.
## ℹ Use `all_of(actual)` instead of `actual` to silence this message.
## ℹ See <https://tidyselect.r-lib.org/reference/faq-external-vector.html>.
## This message is displayed once per session.
## Note: Using an external vector in selections is ambiguous.
## ℹ Use `all_of(cond)` instead of `cond` to silence this message.
## ℹ See <https://tidyselect.r-lib.org/reference/faq-external-vector.html>.
## This message is displayed once per session.
## Note: Using an external vector in selections is ambiguous.
## ℹ Use `all_of(uncond)` instead of `uncond` to silence this message.
## ℹ See <https://tidyselect.r-lib.org/reference/faq-external-vector.html>.
## This message is displayed once per session.
## Note: Using an external vector in selections is ambiguous.
## ℹ Use `all_of(x)` instead of `x` to silence this message.
## ℹ See <https://tidyselect.r-lib.org/reference/faq-external-vector.html>.
## This message is displayed once per session.
## [1] "OOS R Squared: 0.0047"
## [1] "MSE-F: 1.8524"
## Note: Using an external vector in selections is ambiguous.
## ℹ Use `all_of(predictor)` instead of `predictor` to silence this message.
## ℹ See <https://tidyselect.r-lib.org/reference/faq-external-vector.html>.
## This message is displayed once per session.

## [1] "IS R Squared: 0.0106"
## [1] "OOS R Squared: -0.0104"
## [1] "MSE-F: -4.054"
## [1] "IS R Squared: 0.0045"
## [1] "OOS R Squared: -0.0023"
## [1] "MSE-F: -0.9222"
## [1] "IS R Squared: 0.0051"
## [1] "OOS R Squared: -0.0017"
## [1] "MSE-F: -0.658"
## [1] "IS R Squared: 0.012"
## [1] "OOS R Squared: -0.0086"
## [1] "MSE-F: -3.3515"
## [1] "IS R Squared: 1e-04"
## [1] "OOS R Squared: -0.0079"
## [1] "MSE-F: -3.1035"

## [1] "port_B.csv"
## [1] "B"
## ##------ Tue May 24 11:03:47 2022 ------##
## [1] "OOS R Squared: 0.0042"
## [1] "MSE-F: 1.6644"

## [1] "IS R Squared: 0.0085"
## [1] "OOS R Squared: -0.0116"
## [1] "MSE-F: -4.4666"
## [1] "IS R Squared: 0.0045"
## [1] "OOS R Squared: -0.0026"
## [1] "MSE-F: -1.028"
## [1] "IS R Squared: 0.0046"
## [1] "OOS R Squared: -0.0021"
## [1] "MSE-F: -0.7981"
## [1] "IS R Squared: 0.0089"
## [1] "OOS R Squared: -0.0093"
## [1] "MSE-F: -3.5859"
## [1] "IS R Squared: 0"
## [1] "OOS R Squared: -0.0111"
## [1] "MSE-F: -4.2841"

## [1] "port_M.csv"
## [1] "M"
## ##------ Tue May 24 11:03:51 2022 ------##
## [1] "OOS R Squared: -0.0044"
## [1] "MSE-F: -1.7261"

## [1] "IS R Squared: 0.0048"
## [1] "OOS R Squared: -0.0148"
## [1] "MSE-F: -5.6693"
## [1] "IS R Squared: 0.0027"
## [1] "OOS R Squared: -0.0063"
## [1] "MSE-F: -2.4236"
## [1] "IS R Squared: 0.0041"
## [1] "OOS R Squared: -0.0065"
## [1] "MSE-F: -2.5162"
## [1] "IS R Squared: 0.0063"
## [1] "OOS R Squared: -0.018"
## [1] "MSE-F: -6.9117"
## [1] "IS R Squared: 9e-04"
## [1] "OOS R Squared: -0.0148"
## [1] "MSE-F: -5.6844"

## [1] "port_S.csv"
## [1] "S"
## ##------ Tue May 24 11:03:53 2022 ------##
## [1] "OOS R Squared: -0.0842"
## [1] "MSE-F: -30.3552"

## [1] "IS R Squared: 6e-04"
## [1] "OOS R Squared: -0.027"
## [1] "MSE-F: -10.2633"
## [1] "IS R Squared: 0.0031"
## [1] "OOS R Squared: -0.0082"
## [1] "MSE-F: -3.1879"
## [1] "IS R Squared: 0.0061"
## [1] "OOS R Squared: -0.0089"
## [1] "MSE-F: -3.4437"
## [1] "IS R Squared: 0.0013"
## [1] "OOS R Squared: -0.0384"
## [1] "MSE-F: -14.4361"
## [1] "IS R Squared: 0"
## [1] "OOS R Squared: -0.0093"
## [1] "MSE-F: -3.5874"

Table 2 - Forecasts of portfolio returns

This table demonstrates the in-sample and out-of-sample R-squares for the market and six size and book-to-market equity ratio sorted portfolios from predictive regressions and the Sum-of-the-Parts method. IS R-squares are estimated using the whole sample period and the OOS R-squares are calculated compare the forecast error of the model against the historical mean model. The full sample period starts from Feb 1966 to December 2019 and the IS period is set to be 20 years with forecsats beginning in Feb 1986. The MSE-F statistics are calculated to test the hypothesis \(H_0: \text{out-of-sample R-squares} = 0\) vs \(H_1: \text{out-of-sample R-squares} \neq 0\).

Predictors here are all in log terms.

gt(table2.df, rowname_col = "rowname", groupname_col = "portname") %>%
  tab_header(title = "Table 2 - Forecasts of portfolio returns",
             subtitle = paste(freq_name(freq = freq), " data starts from ", first(data_decompose$month), " and ends in ", last(data_decompose$month), ".", sep = "")) %>%
  fmt_number(columns = 1:4, decimals = 6, suffixing = TRUE)
Table 2 - Forecasts of portfolio returns
monthly data starts from Jun 1967 and ends in Dec 2019.
IS_r.squared OOS_r.squared MAE_A MSE_F McCracken
Market
DP 0.010630 −0.010370 0.032611 −4.054026
PE 0.004546 −0.002340 0.032475 −0.922206
EY 0.005117 −0.001669 0.032494 −0.657989
DY 0.011952 −0.008557 0.032621 −3.351461
Payout 0.000117 −0.007919 0.032081 −3.103538
SOP NA 0.004656 0.032173 1.852440 **
B
DP 0.008532 −0.011586 0.032310 −4.466628
PE 0.004495 −0.002643 0.031839 −1.027968
EY 0.004635 −0.002051 0.031827 −0.798102
DY 0.008892 −0.009280 0.032292 −3.585872
Payout 0.000041 −0.011107 0.031542 −4.284127
SOP NA 0.004239 0.031480 1.664405 **
M
DP 0.004777 −0.014751 0.038891 −5.669325
PE 0.002708 −0.006253 0.038925 −2.423593
EY 0.004144 −0.006494 0.038980 −2.516162
DY 0.006288 −0.018042 0.038976 −6.911664
Payout 0.000889 −0.014791 0.038756 −5.684400
SOP NA −0.004434 0.038344 −1.726146
S
DP 0.000614 −0.027027 0.044250 −10.263306
PE 0.003138 −0.008242 0.044612 −3.187931
EY 0.006133 −0.008909 0.044748 −3.443730
DY 0.001256 −0.038439 0.044453 −14.436120
Payout 0.000000 −0.009284 0.044469 −3.587393
SOP NA −0.084169 0.045584 −30.355231

Figure 4 - Monthly return predictions

Here I only present the monthly predictions of the historical mean model, the SOP method and the predictive regressions based on the dividend-price ratio and the earnings-price ratio.

## [1] "market_Allfirms.csv"
## [1] "Market"
## ##------ Tue May 24 11:03:58 2022 ------##

## [1] "port_B.csv"
## [1] "B"
## ##------ Tue May 24 11:04:01 2022 ------##

## [1] "port_M.csv"
## [1] "M"
## ##------ Tue May 24 11:04:04 2022 ------##

## [1] "port_S.csv"
## [1] "S"
## ##------ Tue May 24 11:04:07 2022 ------##

Figure 5 - Trading Performance (with no trading restrictions)

## Warning in window.default(x, ...): 'start' value not changed

## Warning in window.default(x, ...): 'start' value not changed

## Warning in window.default(x, ...): 'start' value not changed

## Warning in window.default(x, ...): 'start' value not changed

## Warning in xy.coords(x = matrix(rep.int(tx, k), ncol = k), y = x, log =
## log, : 776 y values <= 0 omitted from logarithmic plot

## Warning in window.default(x, ...): 'start' value not changed

## Warning in window.default(x, ...): 'start' value not changed

## Warning in xy.coords(x = matrix(rep.int(tx, k), ncol = k), y = x, log =
## log, : 776 y values <= 0 omitted from logarithmic plot

## Warning in window.default(x, ...): 'start' value not changed

## Warning in window.default(x, ...): 'start' value not changed

## Warning in xy.coords(x = matrix(rep.int(tx, k), ncol = k), y = x, log =
## log, : 2 y values <= 0 omitted from logarithmic plot

Table 3 - Certaint equivalent gains

Trading Strategies: certaint equivalent gains

This table shows the out-of-sample portfolio choice results at monthly frequencies from predictive regressions and the SOP method. The trading strategy for each portfolio is designed by optimally allocating funds between the risk-free asset and the corresponding risky portfolio. The certainty equivalent return is \(\overline{rp} - \frac{1}{2} \gamma \hat{\sigma}_{rp}^{2}\) with a risk-aversion coefficient \(\gamma = 3\). The annualised certainty equivalent gain (in percentage) is the monthly certainty equivalent gain multiplied by the corresponding frequency (e.g. 12 for monthly data).

dt <- table3.df %>%
  filter(rowname %in% c(ratio_names, "sop_simple")) %>%
  select(CEGs_annualised, rowname, portname)

as.data.frame(matrix(dt$CEGs_annualised, byrow = F, nrow = length(ratio_names) + 1, ncol = length(id.names))) %>%
  `colnames<-`(unique(dt$portname)) %>%
  mutate(Variable = unique(dt$rowname)) %>%
  # round(digits = 4) %>%
  as.tbl() %>%
  select(Variable, unique(dt$portname)) %>%
  gt(rowname_col = "Variable") %>%
  tab_header(title = "Table 3 - Trading Strategies: certainty equivalent gains",
             subtitle = paste(str_to_title(freq_name(freq = freq)), " data starts from ", first(data_decompose$month) + 20, " and ends in ", last(data_decompose$month), ".", sep = "")) %>%
  fmt_percent(columns = 2:(length(id.names)+1), decimals = 2)
Table 3 - Trading Strategies: certainty equivalent gains
Monthly data starts from Jun 1987 and ends in Dec 2019.
Market B M S
sop_simple 1.10% −6,202.04% −72.11% −8.94%
DP −2.85% 5,897.42% −589.82% 24.30%
PE 0.84% 12,198.04% 66.44% 25.21%
EY 0.98% 11,590.03% 62.69% 21.35%
DY −2.36% 10,041.59% −820.74% 15.87%
Payout −4.13% −25,568.22% −180.58% −7.58%

Table 4 - Sharpe ratio Gains

Trading Strategies: Sharpe ratio Gains

This table presents the Sharpe ratio of the out-of-sample performance of trading strategies, allocating funds between risk-free and risky assets for each portfolio. The annualised Sharpe ratio is generated by multipling the monthly Sharpe ratio by square root of the corresponding frequency (e.g. \(\sqrt{12}\) for monthly data).

dt <- table4.df %>%
  filter(rowname %in% c(ratio_names, "sop_simple")) %>%
  select(SRG_annualised, rowname, portname)

as.data.frame(matrix(dt$SRG_annualised, byrow = F, nrow = length(ratio_names) + 1, ncol = length(id.names))) %>%
  `colnames<-`(unique(dt$portname)) %>%
  mutate(Variable = unique(dt$rowname)) %>%
  # round(digits = 4) %>%
  as.tbl() %>%
  select(Variable, unique(dt$portname)) %>%
  gt(rowname_col = "Variable") %>%
  tab_header(title = "Table 4 - Trading Strategies: Sharpe ratio gains", 
             subtitle = paste(str_to_title(freq_name(freq = freq)), " data starts from ", first(data_decompose$month) + 20, " and ends in ", last(data_decompose$month), ".", sep = "")) %>%
  fmt_number(columns = 2:(length(id.names)+1), decimals = 4) 
Table 4 - Trading Strategies: Sharpe ratio gains
Monthly data starts from Jun 1987 and ends in Dec 2019.
Market B M S
sop_simple 0.0524 −0.0036 −0.0336 0.2160
DP −0.1667 0.3457 −0.1432 0.5070
PE 0.0674 0.0491 0.5155 0.4305
EY 0.0827 0.0192 0.4540 0.3849
DY −0.1441 0.3492 −0.1490 0.4872
Payout −0.1547 −0.0059 −0.0953 −0.0711

Figure 6 - Sensitivity of Certainty Equivalent Gains relative to Risk-Aversion level

This figure presents the out-of-sample portfolio choice results at monthly frequency from bivariate predictive regressions and the SOP method with different levels of risk-aversion. To show that our previous results hold with respect to investors with different levels of risk aversion, we evaluate the changes in certainty equivalent gains with respect to the changes in the level of risk-aversion. The results of the trading strategy reported here are without trading restrictions (as in Table 5), allocating funds between the risk-free asset and the risky equity portfolio. The portfolio choice results are evaluated in the certainty equivalent return with relative risk-aversion coefficient \(\gamma\), with ${\(0.5, 1, 1.5, 2, 2.5, 3, 3.5, 4, 4.5, 5\)}$. Risky equity portfolios include the market portfolio and six size and book-to-market equity sorted portfolios, BH, BM, BL, SH, SM and SL. The annualised certainty equivalent gain is the monthly certainty equivalent gain multiplied by twelve. The sample period is from February 1966 to December 2019 and the out-of-sample period starts in March 1986.

## [1] "Market"
## ##------ Tue May 24 11:04:13 2022 ------##
## [1] "B"
## ##------ Tue May 24 11:04:13 2022 ------##
## [1] "M"
## ##------ Tue May 24 11:04:14 2022 ------##
## [1] "S"
## ##------ Tue May 24 11:04:14 2022 ------##
## Warning: Removed 21 rows containing missing values (geom_point).
## Warning: Removed 21 row(s) containing missing values (geom_path).

Table 5 - MSPE-adjusted Statistic

MSPE-adjusted Statistic

This table presents the MSEP-adjusted Statistics, evaluating the statistical significance of the out-of-sample R-squared statistics of each model in the corresponding portfolio.

See Rapach et al., (2010) and Clark and West (2007) for the detailed procedure.

table5.df <- data.frame()
for (port in names(TABLE5)) {
  pt <- TABLE5[[port]]
  pt$rowname <- rownames(pt)
  pt$portname <- port
  colnames(pt)[4] <- "star"
  table5.df <- rbind.data.frame(table5.df, pt)
}

table5.output <- gt(table5.df, rowname_col = "rowname", groupname_col = "portname") %>%
  fmt_percent(columns = vars(OOS_r.squared, mspe_pvalue), decimals = 2) %>%
  fmt_number(columns = vars(mspe_t), decimals = 4) %>%
  tab_header(title = "Table 5 - MSPE-adjusted Statistic",
             subtitle = paste(str_to_title(freq_name(freq = freq)), " data starts from ", first(data_decompose$month), " and ends in ", last(data_decompose$month), ".", sep = ""))

table5.output
Table 5 - MSPE-adjusted Statistic
Monthly data starts from Jun 1967 and ends in Dec 2019.
OOS_r.squared mspe_t mspe_pvalue star
Market
DP −1.04% 0.7486 22.73%
PE −0.23% 0.6344 26.31%
EY −0.17% 0.7180 23.66%
DY −0.86% 0.9945 16.03%
Payout −0.79% −1.4743 92.94%
SOP 0.47% 1.2007 11.53%
B
DP −1.16% 0.5672 28.55%
PE −0.26% 0.6458 25.94%
EY −0.21% 0.6681 25.22%
DY −0.93% 0.6839 24.72%
Payout −1.11% −1.1848 88.16%
SOP 0.42% 1.0644 14.39%
M
DP −1.48% −0.1912 57.58%
PE −0.63% 0.3728 35.47%
EY −0.65% 0.5794 28.13%
DY −1.80% 0.0752 47.00%
Payout −1.48% −1.1360 87.17%
SOP −0.44% −0.1345 55.35%
S
DP −2.70% −0.2803 61.03%
PE −0.82% 0.5550 28.96%
EY −0.89% 0.9424 17.33%
DY −3.84% 0.1973 42.18%
Payout −0.93% −1.1750 87.96%
SOP −8.42% −0.3078 62.08%