Inside data at the OSE Finansavisen s portfolio

Size: px
Start display at page:

Download "Inside data at the OSE Finansavisen s portfolio"

Transcription

1 Inside data at the OSE Finansavisen s portfolio Bernt Arne Ødegaard Aug 2015 This note shows the actual calculation of some of the results in the article. 1 Descriptives for the portfolio Table 1 Describing the return on the Finansavisen portfolio We describe the return of the Finansavisen Inside Portfolio, together with two market indices, one equally weighted (EW) and one value weighted (VW). Panel A: Returns and Sharpe Ratios Panel B: Information Ratios Rp erp erm(ew) erm(vw) mean Sharpe IR(R p, Rm EW ) IR(R p, Rm V W ) R p

2 1.1 Showing the calculation Implementing the analysis Returns in the file inside_portfolio.csv: "Index";"Rp";"eRp" ; ;NA ; ; ; ; The factors in the file "Index";"eRmEW";"eRmVW";"SMB";"HML" ; ; ; ; ; ; ; ; ; ; ; ; library(zoo) InsidePortf < read.zoo("inside_portfolio.csv", header=true) Rp < na.omit(insideportf$rp) erp < na.omit(insideportf$erp) PricFact < read.zoo("pricing_factors.csv", 10 header=true) ermew < na.omit(pricfact$ermew) ermvw < na.omit(pricfact$ermvw) # take intersection to align the data data < merge(rp,erp,ermew,ermvw,all=false) Rp < data$rp erp < data$erp ermew < data$ermew ermvw < data$ermvw 20 2

3 source("read_data.r") library(stargazer) library(xtable) outdir < "../../results/2015_08_descriptive/" table < matrix(nrow=2,ncol=4) colnames(table) < c("rp","erp","erm(ew)","erm(vw)") rownames(table) < c("mean","sharpe") 10 table[1,1] < mean(rp) table[1,2] < mean(erp) table[1,3] < mean(ermew) table[1,4] < mean(ermvw) table[2,2] < mean(erp)/sd(erp) table[2,3] < mean(ermew)/sd(ermew) table[2,4] < mean(ermvw)/sd(ermvw) filename < paste(outdir,"descriptive_weekly_returns.tex",sep="") print(filename) stargazer(table, out=filename, digits=4, float=false,header=false) 20 table < matrix(nrow=1,ncol=2) colnames(table) < c("$ir(r_p,r_m^{ew})$","$ir(r_p,r_m^{vw})$") rownames(table) < c("$r_p$") 30 ir < mean(erp ermew)/sd(erp ermew) table[1,1] < ir ir < mean(erp ermvw)/sd(erp ermvw) table[1,2] < ir filename < paste(outdir,"descriptive_information_ratios.tex",sep="") print(xtable(table,digits=3,align="lcc"), floating=false,file=filename, type = "latex", sanitize.text.function = function(x){x}) 40 3

4 2 Finansavisen portfolio performance evaluation 2.1 Static Alpha Estimates A standard benchmark for academic studies is the three-factor model of Fama and French (1995). er pt = α p + β p RMRF t + s p SMB t + h p HML t + ε pt where er pt is the time-t excess return on a the managed portfolio (net return minus T-bill return); RMRF t is the time-t excess return on a aggregate market proxy portfolio; and SMB t and HML t are time-t returns on zero-investment factor-mimicking portfolios for size and book-to-market (BTM) equity, repectively. Table 2 shows the results from estimating this model, both with a single factor (the market RMRF) and the three factor model. We investigate two choices for the market portfolio. In (1) we use an equally weighted market index, in (2) a value weighted Implementing the analysis Returns in the file inside_portfolio.csv: "Index";"Rp";"eRp" ; ;NA ; ; ; ; The factors in the file "Index";"eRmEW";"eRmVW";"SMB";"HML" ; ; ; ; ; ; ; ; ; ; ; ; Reading the files into R: library(zoo) InsidePortf < read.zoo("inside_portfolio.csv", header=true) erp < InsidePortf$eRp PricFact < read.zoo("pricing_factors.csv", header=true) 10 4

5 Table 2 Perfomance evaluation - benchmark regression The table shows results from several performance regressions of Finansavisen portfolios. Panel A a single factor model, Panel B a three factor model. We show calculations for the Finansavisen portfolio under the assumptions that trades are done at monday. In each table we shown results for two specifications: (1): EW market index and (2) VW market index. Panel A: Single factor model Dependent variable: EW erp VW (1) (2) Constant (0.001) (0.001) erm (0.044) (0.033) Observations Adjusted R Note: p<0.1; p<0.05; p<0.01 Panel B: Three factor model Dependent variable: EW erp VW (1) (2) Constant (0.001) (0.001) erm (0.050) (0.046) SMB (0.045) (0.059) HML (0.044) (0.045) Observations Adjusted R Note: p<0.1; p<0.05; p<0.01 5

6 Running the Fama French Regression source("read_data.r") library(stargazer) outdir < "../../results/2015_08_estimation/" data < merge(erp,pricfact,all=true) erm < as.matrix(data$ermew) erp < as.matrix(data$erp) regr1 < lm(erp erm) 10 summary(regr1) erm < as.matrix(data$ermvw) regr2 < lm(erp erm) summary(regr2) filename < paste(outdir, "regression_single_factor.tex", sep="") stargazer(regr1,regr2, out=filename, column.labels=c("ew","vw"), 20 float=false,header=false,intercept.bottom=false, omit.stat=c("rsq","f","ser")) erp < as.matrix(data$erp) SMB < as.matrix(data$smb) HML < as.matrix(data$hml) erm < as.matrix(data$ermew) regr1 < lm(erp erm + SMB + HML) erm < as.matrix(data$ermvw) regr2 < lm(erp erm + SMB + HML) 30 filename < paste(outdir, "regression_three_factor.tex", sep="") stargazer(regr1,regr2, out=filename, column.labels=c("ew","vw"), float=false,header=false,intercept.bottom=false, omit.stat=c("rsq","f","ser")) 6

7 2.2 Stochasic Discount Factor based performance evaluation A more modern approach to performance analysis is to use stochastic discount factors to do the evaluation. Theoretically, this approach is applicable under a much wider set of distributional assumptions than the previous regression approach. It is also less dependent on the choice of benchmark. The starting point is that any asset pricing model can be written as a condition on the stochastic discount factor m t that prices the risk in the economy at time t. E t 1 [m t R t 1] = 0, where R t is the (gross) return on the primitive assets in the economy. This relationship must also hold for any managed portfolio p: E t 1 [m t R pt 1] = 0 To do performance evaluation we use a two step procedure. First we estimate the discount factor m using data for the crossection of assets. The resulting empirical ˆm is then used to calculate a stochastic discount factor alpha: α p = E t 1 [ ˆm t R pt ] 1 If we use excess returns er pt, the calculation is α p = E t 1 [ ˆm t er pt ] We implement this analysis on the inside portfolios. We first need a parameterization of the discount factor m. We choose a three-factor model m t = 1 + b 1 er mt + b 2 SMB t + b 3 HML t The parameters of this model is estimated using GMM on ten size-sorted portfolios for the Norwegian cross-section over the same period we do performance evaluation. The estimated m is then used to calculate the alpha. The resulting estimates are shown in table 3. Table 3 Estimating performance with a stochastic discount factor approach We estimate the parameters of m t = 1 + b 1eR mt + b 2SMB t + b 3HML t using 10 size based portfolios for Norway. The resulting empirical m is then used to estimate alphas. The alphas are summarized in Panel A. The parameters of the SDF are estimated with GMM. The parameter estimates are shown in Panels B and C. We list parameter estimates and standard deviations. Panel A: Alpha estimates mean p-value InsPort Panel B: The parameters of the estimated stochastic discount factor Stochastic Discount Factor b (4.309) b (2.986) b (12.656) Num. obs. 994 p < 0.001, p < 0.01, p < Implementing the analysis Returns in the file inside_portfolio.csv: 7

8 "Index";"Rp";"eRp" ; ;NA ; ; ; ; The factors in the file factors.csv "Index";"eRmEW";"eRmVW";"SMB";"HML" ; ; ; ; ; ; ; ; ; ; ; ; The size portfolios in size_portfolios.csv "Index";"P1";"P2";"P3";"P4";"P5";"P6";"P7";"P8";"P9";"P10" ; ; ; ; ; ; ; ; ; ; ; e-05; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; ; Reading the files into R: library(zoo) InsidePortf < read.zoo("inside_portfolio.csv", header=true) erp < InsidePortf$eRp PricFact < read.zoo("pricing_factors.csv", header=true) 10 ermew < na.omit(pricfact$ermew) ermvw < na.omit(pricfact$ermvw) HML < PricFact$HML SMB < PricFact$SMB SizePortfs < read.zoo("size_portfolios.csv", header=true) 8

9 Running the SDF estimation, and alpha estimation source("read_data.r") library(texreg) library(stargazer) outdir < "../../results/2015_08_estimate_sdf/" table < matrix(ncol=2,nrow=1) colnames(table) < c("mean","p-value") rownames(table) < c("insport") 10 er < SizePortfs erm < ermew # take intersection to align the data data < merge(er,erm,smb,hml, all=false) er < as.matrix(data[,1:10]) erm < as.matrix(data[,11]) SMB < as.matrix(data[,12]) HML < as.matrix(data[,13]) X < cbind(er,erm,smb,hml) g < function (parms,x) { 20 b1 < parms[1] b2 < parms[2] b3 < parms[3] m < 1 + b1 * X[,11] + b2 * X[,12] + b3 * X[,13] e < m * X[,1:10] return (e); } library(gmm) t0 < c(0.1,0,0) res < gmm(g,x,t0) 30 filename < paste(outdir,"sdf_estimation.tex",sep="") texreg(res, file=filename, single.row=true, table=false, digits=3, use.packages=false, custom.model.names=c("stochastic Discount Factor"), custom.coef.names =c("$b_1$","$b_2$","$b_3$"), include.obj.fcn=false, 40 dcolumn=true) Theta < as.numeric(res$coefficients) m < 1 + Theta[1] * X[,11] + Theta[2] * X[,12] + Theta[3] * X[,13] m < zoo(m,order.by=index(data)) InsideRets < erp data < merge(m,insiderets,all=false) mhat < data$m InsideRets < data$insiderets 50 alpha < mhat*insiderets tt < t.test(alpha) pval < tt$p.value table[1,1] < mean(alpha) table[1,2] < pval filename < paste(outdir,"sdf_estimation_performance_evaluation.tex",sep="") stargazer(table,out=filename, digits=4, float=false,header=false) 9

10 References Eugene F Fama and Kenneth R French. Size and book-to-market factors in earnings and returns. Journal of Finance, 50 (1):131 56, March

Performance evaluation of managed portfolios

Performance evaluation of managed portfolios Performance evaluation of managed portfolios The business of evaluating the performance of a portfolio manager has developed a rich set of methodologies for testing whether a manager is skilled or not.

More information

Finansavisen A case study of secondary dissemination of insider trade notifications

Finansavisen A case study of secondary dissemination of insider trade notifications Finansavisen A case study of secondary dissemination of insider trade notifications B Espen Eckbo and Bernt Arne Ødegaard Oct 2015 Abstract We consider a case of secondary dissemination of insider trades.

More information

The Finansavisen Inside Portfolio

The Finansavisen Inside Portfolio The Finansavisen Inside Portfolio B. Espen Eckbo Tuck School of Business, Darthmouth College Bernt Arne Ødegaard University of Stavanger (UiS) We consider a case of secondary dissemination of insider trades.

More information

Measuring Performance with Factor Models

Measuring Performance with Factor Models Measuring Performance with Factor Models Bernt Arne Ødegaard February 21, 2017 The Jensen alpha Does the return on a portfolio/asset exceed its required return? α p = r p required return = r p ˆr p To

More information

Empirics of the Oslo Stock Exchange:. Asset pricing results

Empirics of the Oslo Stock Exchange:. Asset pricing results Empirics of the Oslo Stock Exchange:. Asset pricing results. 1980 2016. Bernt Arne Ødegaard Jan 2017 Abstract We show the results of numerous asset pricing specifications on the crossection of assets at

More information

Liquidity and asset pricing

Liquidity and asset pricing Liquidity and asset pricing Bernt Arne Ødegaard 21 March 2018 1 Liquidity in Asset Pricing Much market microstructure research is concerned with very a microscope view of financial markets, understanding

More information

SDF based asset pricing

SDF based asset pricing SDF based asset pricing Bernt Arne Ødegaard 20 September 2018 Contents 1 General overview of asset pricing testing. 1 1.1 Pricing operators........................................ 1 2 Present value relationship.

More information

State Ownership at the Oslo Stock Exchange. Bernt Arne Ødegaard

State Ownership at the Oslo Stock Exchange. Bernt Arne Ødegaard State Ownership at the Oslo Stock Exchange Bernt Arne Ødegaard Introduction We ask whether there is a state rebate on companies listed on the Oslo Stock Exchange, i.e. whether companies where the state

More information

Crossectional asset pricing - Fama French The research post CAPM-APT. The Fama French papers and the literature following.

Crossectional asset pricing - Fama French The research post CAPM-APT. The Fama French papers and the literature following. Crossectional asset pricing - Fama French The research post CAPM-APT. The Fama French papers and the literature following. The Fama French debate Background: Fama on efficient markets Fama at the forefront

More information

NHY examples. Bernt Arne Ødegaard. 23 November Estimating dividend growth in Norsk Hydro 8

NHY examples. Bernt Arne Ødegaard. 23 November Estimating dividend growth in Norsk Hydro 8 NHY examples Bernt Arne Ødegaard 23 November 2017 Abstract Finance examples using equity data for Norsk Hydro (NHY) Contents 1 Calculating Beta 4 2 Cost of Capital 7 3 Estimating dividend growth in Norsk

More information

The Norwegian State Equity Ownership

The Norwegian State Equity Ownership The Norwegian State Equity Ownership B A Ødegaard 15 November 2018 Contents 1 Introduction 1 2 Doing a performance analysis 1 2.1 Using R....................................................................

More information

The debate on NBIM and performance measurement, or the factor wars of 2015

The debate on NBIM and performance measurement, or the factor wars of 2015 The debate on NBIM and performance measurement, or the factor wars of 2015 May 2016 Bernt Arne Ødegaard University of Stavanger (UiS) How to think about NBIM Principal: People of Norway Drawing by Arild

More information

State Ownership at the Oslo Stock Exchange

State Ownership at the Oslo Stock Exchange State Ownership at the Oslo Stock Exchange Bernt Arne Ødegaard 1 Introduction We ask whether there is a state rebate on companies listed on the Oslo Stock Exchange, i.e. whether companies where the state

More information

Seasonality at The Oslo Stock Exchange

Seasonality at The Oslo Stock Exchange Seasonality at The Oslo Stock Exchange Bernt Arne Ødegaard September 6, 2018 Seasonality concerns patterns in stock returns related to calendar time. Internationally, the best known such pattern is the

More information

The New Issues Puzzle

The New Issues Puzzle The New Issues Puzzle Professor B. Espen Eckbo Advanced Corporate Finance, 2009 Contents 1 IPO Sample and Issuer Characteristics 1 1.1 Annual Sample Distribution................... 1 1.2 IPO Firms are

More information

Arbitrage Pricing Theory and Multifactor Models of Risk and Return

Arbitrage Pricing Theory and Multifactor Models of Risk and Return Arbitrage Pricing Theory and Multifactor Models of Risk and Return Recap : CAPM Is a form of single factor model (one market risk premium) Based on a set of assumptions. Many of which are unrealistic One

More information

Asset pricing at the Oslo Stock Exchange. A Source Book

Asset pricing at the Oslo Stock Exchange. A Source Book Asset pricing at the Oslo Stock Exchange. A Source Book Bernt Arne Ødegaard BI Norwegian School of Management and Norges Bank February 2007 In this paper we use data from the Oslo Stock Exchange in the

More information

CHAPTER 10. Arbitrage Pricing Theory and Multifactor Models of Risk and Return INVESTMENTS BODIE, KANE, MARCUS

CHAPTER 10. Arbitrage Pricing Theory and Multifactor Models of Risk and Return INVESTMENTS BODIE, KANE, MARCUS CHAPTER 10 Arbitrage Pricing Theory and Multifactor Models of Risk and Return INVESTMENTS BODIE, KANE, MARCUS McGraw-Hill/Irwin Copyright 2011 by The McGraw-Hill Companies, Inc. All rights reserved. INVESTMENTS

More information

Crossectional asset pricing post CAPM-APT: Fama - French

Crossectional asset pricing post CAPM-APT: Fama - French Crossectional asset pricing post CAPM-APT: Fama - French June 6, 2018 Contents 1 The Fama French debate 1 1.1 Introduction........................................................... 1 1.2 Background: Fama

More information

Long and Short Run Correlation Risk in Stock Returns

Long and Short Run Correlation Risk in Stock Returns Long and Short Run Correlation Risk in Stock Returns Discussion by Ric Colacito Econometric Society Winter Meetings, Denver, 1/2011 1 / 10 Contribution 1 Background: market variance risk premium predicts

More information

Size Matters, if You Control Your Junk

Size Matters, if You Control Your Junk Discussion of: Size Matters, if You Control Your Junk by: Cliff Asness, Andrea Frazzini, Ronen Israel, Tobias Moskowitz, and Lasse H. Pedersen Kent Daniel Columbia Business School & NBER AFA Meetings 7

More information

Measurement of cost of equity trading - the LOT measure

Measurement of cost of equity trading - the LOT measure Measurement of cost of equity trading - the LOT measure Bernt Arne Ødegaard 25 October 208 Contents 0. Intuition.................................................. The LOT cost measure 2 LOT estimation

More information

FIN822 project 3 (Due on December 15. Accept printout submission or submission )

FIN822 project 3 (Due on December 15. Accept printout submission or  submission ) FIN822 project 3 (Due on December 15. Accept printout submission or email submission donglinli2006@yahoo.com. ) Part I The Fama-French Multifactor Model and Mutual Fund Returns Dawn Browne, an investment

More information

Forecasting the Equity Premium

Forecasting the Equity Premium Forecasting the Equity Premium Bernt Arne Ødegaard 6 September 2018 Contents 1 The Equity Market Premium 1 2 Is the equity market premium predictable? 1 2.1 How predictable can the market be?..............................

More information

Persistence in Mutual Fund Performance: Analysis of Holdings Returns

Persistence in Mutual Fund Performance: Analysis of Holdings Returns Persistence in Mutual Fund Performance: Analysis of Holdings Returns Samuel Kruger * June 2007 Abstract: Do mutual funds that performed well in the past select stocks that perform well in the future? I

More information

Liquidity and Asset Pricing. Evidence on the role of Investor Holding Period.

Liquidity and Asset Pricing. Evidence on the role of Investor Holding Period. Liquidity and Asset Pricing. Evidence on the role of Investor Holding Period. Randi Næs Norges Bank Bernt Arne Ødegaard Norwegian School of Management BI and Norges Bank UiS, Sep 2007 Holding period This

More information

CHAPTER 10. Arbitrage Pricing Theory and Multifactor Models of Risk and Return INVESTMENTS BODIE, KANE, MARCUS

CHAPTER 10. Arbitrage Pricing Theory and Multifactor Models of Risk and Return INVESTMENTS BODIE, KANE, MARCUS CHAPTER 10 Arbitrage Pricing Theory and Multifactor Models of Risk and Return McGraw-Hill/Irwin Copyright 2011 by The McGraw-Hill Companies, Inc. All rights reserved. 10-2 Single Factor Model Returns on

More information

Is Economic Uncertainty Priced in the Cross-Section of Stock Returns?

Is Economic Uncertainty Priced in the Cross-Section of Stock Returns? Is Economic Uncertainty Priced in the Cross-Section of Stock Returns? Turan Bali, Georgetown University Stephen Brown, NYU Stern, University Yi Tang, Fordham University 2018 CARE Conference, Washington

More information

1 Estimating risk factors for IBM - using data 95-06

1 Estimating risk factors for IBM - using data 95-06 1 Estimating risk factors for IBM - using data 95-06 Basic estimation of asset pricing models, using IBM returns data Market model r IBM = a + br m + ɛ CAPM Fama French 1.1 Using octave/matlab er IBM =

More information

Department of Finance Working Paper Series

Department of Finance Working Paper Series NEW YORK UNIVERSITY LEONARD N. STERN SCHOOL OF BUSINESS Department of Finance Working Paper Series FIN-03-005 Does Mutual Fund Performance Vary over the Business Cycle? Anthony W. Lynch, Jessica Wachter

More information

E[r i ] = r f + β i (E[r m ] r f. Investment s risk premium is proportional to the expectation of the market risk premium: er mt = r mt r ft

E[r i ] = r f + β i (E[r m ] r f. Investment s risk premium is proportional to the expectation of the market risk premium: er mt = r mt r ft The Equity Premium Equity Premium: How much more return an investor requires to hold a risky equity relative to a risk free investment. Equity Market Premium: The amount of extra return an investor needs

More information

Economics of Behavioral Finance. Lecture 3

Economics of Behavioral Finance. Lecture 3 Economics of Behavioral Finance Lecture 3 Security Market Line CAPM predicts a linear relationship between a stock s Beta and its excess return. E[r i ] r f = β i E r m r f Practically, testing CAPM empirically

More information

Keywords: Equity firms, capital structure, debt free firms, debt and stocks.

Keywords: Equity firms, capital structure, debt free firms, debt and stocks. Working Paper 2009-WP-04 May 2009 Performance of Debt Free Firms Tarek Zaher Abstract: This paper compares the performance of portfolios of debt free firms to comparable portfolios of leveraged firms.

More information

Time series: Variance modelling

Time series: Variance modelling Time series: Variance modelling Bernt Arne Ødegaard 5 October 018 Contents 1 Motivation 1 1.1 Variance clustering.......................... 1 1. Relation to heteroskedasticity.................... 3 1.3

More information

Mortgage REITs and Reaching for yield. Aurel Hizmo, Stijn Van Nieuwerburgh and James Vickery

Mortgage REITs and Reaching for yield. Aurel Hizmo, Stijn Van Nieuwerburgh and James Vickery Mortgage REITs and Reaching for yield Aurel Hizmo, Stijn Van Nieuwerburgh and James Vickery 1 Financial intermediation and low interest rates Important for policymakers to monitor emerging financial system

More information

Principles for Risk Adjustment of Performance Figures. Dahlquist, Polk, Priestley, Ødegaard November 2015

Principles for Risk Adjustment of Performance Figures. Dahlquist, Polk, Priestley, Ødegaard November 2015 Principles for Risk Adjustment of Performance Figures Dahlquist, Polk, Priestley, Ødegaard November 2015 Our Task Provide advice on how to measure the risk and return of the GPFG Risk adjusted performance

More information

Cost of Capital. Cost of capital A firm s cost of capital is the required return on its investments.

Cost of Capital. Cost of capital A firm s cost of capital is the required return on its investments. Cost of Capital Cost of capital A firm s cost of capital is the required return on its investments. For capital budgeting purposes, need a cost of capital, the required return on the firm s investments.

More information

Appendix. In this Appendix, we present the construction of variables, data source, and some empirical procedures.

Appendix. In this Appendix, we present the construction of variables, data source, and some empirical procedures. Appendix In this Appendix, we present the construction of variables, data source, and some empirical procedures. A.1. Variable Definition and Data Source Variable B/M CAPX/A Cash/A Cash flow volatility

More information

Should Benchmark Indices Have Alpha? Revisiting Performance Evaluation. Martijn Cremers (Yale) Antti Petajisto (Yale) Eric Zitzewitz (Dartmouth)

Should Benchmark Indices Have Alpha? Revisiting Performance Evaluation. Martijn Cremers (Yale) Antti Petajisto (Yale) Eric Zitzewitz (Dartmouth) Should Benchmark Indices Have Alpha? Revisiting Performance Evaluation Martijn Cremers (Yale) Antti Petajisto (Yale) Eric Zitzewitz (Dartmouth) How Would You Evaluate These Funds? Regress 3 stock portfolios

More information

Daily Data is Bad for Beta: Opacity and Frequency-Dependent Betas Online Appendix

Daily Data is Bad for Beta: Opacity and Frequency-Dependent Betas Online Appendix Daily Data is Bad for Beta: Opacity and Frequency-Dependent Betas Online Appendix Thomas Gilbert Christopher Hrdlicka Jonathan Kalodimos Stephan Siegel December 17, 2013 Abstract In this Online Appendix,

More information

The Equity Premium. Bernt Arne Ødegaard. 20 September 2018

The Equity Premium. Bernt Arne Ødegaard. 20 September 2018 The Equity Premium Bernt Arne Ødegaard 20 September 2018 1 Intro This lecture is concerned with the Equity Premium: How much more return an investor requires to hold a risky security (such as a stock)

More information

Applied Macro Finance

Applied Macro Finance Master in Money and Finance Goethe University Frankfurt Week 2: Factor models and the cross-section of stock returns Fall 2012/2013 Please note the disclaimer on the last page Announcements Next week (30

More information

Using risk factors to evaluate investments and build portfolios. Michael Furey Managing Director Delta Research & Advisory

Using risk factors to evaluate investments and build portfolios. Michael Furey Managing Director Delta Research & Advisory Using risk factors to evaluate investments and build portfolios Michael Furey Managing Director Delta Research & Advisory Pillars for building better quality investor portfolios PortfolioConstruction.com.au

More information

Index Models and APT

Index Models and APT Index Models and APT (Text reference: Chapter 8) Index models Parameter estimation Multifactor models Arbitrage Single factor APT Multifactor APT Index models predate CAPM, originally proposed as a simplification

More information

Inexperienced Investors and Bubbles

Inexperienced Investors and Bubbles Inexperienced Investors and Bubbles Robin Greenwood Harvard Business School Stefan Nagel Stanford Graduate School of Business Q-Group October 2009 Motivation Are inexperienced investors more likely than

More information

THE PENNSYLVANIA STATE UNIVERSITY SCHREYER HONORS COLLEGE DEPARTMENT OF FINANCE

THE PENNSYLVANIA STATE UNIVERSITY SCHREYER HONORS COLLEGE DEPARTMENT OF FINANCE THE PENNSYLVANIA STATE UNIVERSITY SCHREYER HONORS COLLEGE DEPARTMENT OF FINANCE EXAMINING THE IMPACT OF THE MARKET RISK PREMIUM BIAS ON THE CAPM AND THE FAMA FRENCH MODEL CHRIS DORIAN SPRING 2014 A thesis

More information

The study of enhanced performance measurement of mutual funds in Asia Pacific Market

The study of enhanced performance measurement of mutual funds in Asia Pacific Market Lingnan Journal of Banking, Finance and Economics Volume 6 2015/2016 Academic Year Issue Article 1 December 2016 The study of enhanced performance measurement of mutual funds in Asia Pacific Market Juzhen

More information

Aggregation, Capital Heterogeneity, and the Investment CAPM

Aggregation, Capital Heterogeneity, and the Investment CAPM Aggregation, Capital Heterogeneity, and the Investment CAPM Andrei S. Gonçalves 1 Chen Xue 2 Lu Zhang 3 1 UNC 2 University of Cincinnati 3 Ohio State and NBER PBCSF November 21, 218 Introduction Theme

More information

The Fama-French Three Factors in the Chinese Stock Market *

The Fama-French Three Factors in the Chinese Stock Market * DOI 10.7603/s40570-014-0016-0 210 2014 年 6 月第 16 卷第 2 期 中国会计与财务研究 C h i n a A c c o u n t i n g a n d F i n a n c e R e v i e w Volume 16, Number 2 June 2014 The Fama-French Three Factors in the Chinese

More information

Liquidity Risk and Bank Stock Returns. June 16, 2017

Liquidity Risk and Bank Stock Returns. June 16, 2017 Liquidity Risk and Bank Stock Returns Yasser Boualam (UNC) Anna Cororaton (UPenn) June 16, 2017 1 / 20 Motivation Recent financial crisis has highlighted liquidity mismatch on bank balance sheets Run on

More information

The Cross-Section of Credit Risk Premia and Equity Returns

The Cross-Section of Credit Risk Premia and Equity Returns The Cross-Section of Credit Risk Premia and Equity Returns Nils Friewald Christian Wagner Josef Zechner WU Vienna Swissquote Conference on Asset Management October 21st, 2011 Questions that we ask in the

More information

Optimal Portfolio Inputs: Various Methods

Optimal Portfolio Inputs: Various Methods Optimal Portfolio Inputs: Various Methods Prepared by Kevin Pei for The Fund @ Sprott Abstract: In this document, I will model and back test our portfolio with various proposed models. It goes without

More information

Note on Cost of Capital

Note on Cost of Capital DUKE UNIVERSITY, FUQUA SCHOOL OF BUSINESS ACCOUNTG 512F: FUNDAMENTALS OF FINANCIAL ANALYSIS Note on Cost of Capital For the course, you should concentrate on the CAPM and the weighted average cost of capital.

More information

Risk-Adjusted Capital Allocation and Misallocation

Risk-Adjusted Capital Allocation and Misallocation Risk-Adjusted Capital Allocation and Misallocation Joel M. David Lukas Schmid David Zeke USC Duke & CEPR USC Summer 2018 1 / 18 Introduction In an ideal world, all capital should be deployed to its most

More information

Does the Fama and French Five- Factor Model Work Well in Japan?*

Does the Fama and French Five- Factor Model Work Well in Japan?* International Review of Finance, 2017 18:1, 2018: pp. 137 146 DOI:10.1111/irfi.12126 Does the Fama and French Five- Factor Model Work Well in Japan?* KEIICHI KUBOTA AND HITOSHI TAKEHARA Graduate School

More information

How to measure mutual fund performance: economic versus statistical relevance

How to measure mutual fund performance: economic versus statistical relevance Accounting and Finance 44 (2004) 203 222 How to measure mutual fund performance: economic versus statistical relevance Blackwell Oxford, ACFI Accounting 0810-5391 AFAANZ, 44 2ORIGINAL R. Otten, UK D. Publishing,

More information

Foundations of Finance

Foundations of Finance Lecture 5: Stock Positions and Portfolio Return I. Reading. II. Return Calculation and Dividends. III. Stock Positions. IV. Portfolio Return Formula 0 Lecture 5: Stock Positions and Portfolio Return I.

More information

Further Evidence on the Performance of Funds of Funds: The Case of Real Estate Mutual Funds. Kevin C.H. Chiang*

Further Evidence on the Performance of Funds of Funds: The Case of Real Estate Mutual Funds. Kevin C.H. Chiang* Further Evidence on the Performance of Funds of Funds: The Case of Real Estate Mutual Funds Kevin C.H. Chiang* School of Management University of Alaska Fairbanks Fairbanks, AK 99775 Kirill Kozhevnikov

More information

INTERNATIONAL REAL ESTATE REVIEW 2006 Vol. 9 No. 1: pp REIT Mimicking Portfolio Analysis

INTERNATIONAL REAL ESTATE REVIEW 2006 Vol. 9 No. 1: pp REIT Mimicking Portfolio Analysis REIT Mimicking Portfolio Analysis 95 INTERNATIONAL REAL ESTATE REVIEW 2006 Vol. 9 No. 1: pp.95-111 REIT Mimicking Portfolio Analysis Kevin C.H. Chiang College of Business Administration, Northern Arizona

More information

Optimal Debt-to-Equity Ratios and Stock Returns

Optimal Debt-to-Equity Ratios and Stock Returns Utah State University DigitalCommons@USU All Graduate Plan B and other Reports Graduate Studies 5-2014 Optimal Debt-to-Equity Ratios and Stock Returns Courtney D. Winn Utah State University Follow this

More information

B35150 Winter 2014 Quiz Solutions

B35150 Winter 2014 Quiz Solutions B35150 Winter 2014 Quiz Solutions Alexander Zentefis March 16, 2014 Quiz 1 0.9 x 2 = 1.8 0.9 x 1.8 = 1.62 Quiz 1 Quiz 1 Quiz 1 64/ 256 = 64/16 = 4%. Volatility scales with square root of horizon. Quiz

More information

Lecture. Factor Mimicking Portfolios An Illustration

Lecture. Factor Mimicking Portfolios An Illustration Lecture Factor Mimicking Portfolios An Illustration Factor Mimicking Portfolios Useful standard method in empirical finance: Replacing some variable with a function of a bunch of other variables. More

More information

AN ALTERNATIVE THREE-FACTOR MODEL FOR INTERNATIONAL MARKETS: EVIDENCE FROM THE EUROPEAN MONETARY UNION

AN ALTERNATIVE THREE-FACTOR MODEL FOR INTERNATIONAL MARKETS: EVIDENCE FROM THE EUROPEAN MONETARY UNION AN ALTERNATIVE THREE-FACTOR MODEL FOR INTERNATIONAL MARKETS: EVIDENCE FROM THE EUROPEAN MONETARY UNION MANUEL AMMANN SANDRO ODONI DAVID OESCH WORKING PAPERS ON FINANCE NO. 2012/2 SWISS INSTITUTE OF BANKING

More information

On the robustness of the CAPM, Fama-French Three-Factor Model and the Carhart Four-Factor Model on the Dutch stock market.

On the robustness of the CAPM, Fama-French Three-Factor Model and the Carhart Four-Factor Model on the Dutch stock market. Tilburg University 2014 Bachelor Thesis in Finance On the robustness of the CAPM, Fama-French Three-Factor Model and the Carhart Four-Factor Model on the Dutch stock market. Name: Humberto Levarht y Lopez

More information

Are there common factors in individual commodity futures returns?

Are there common factors in individual commodity futures returns? Are there common factors in individual commodity futures returns? Recent Advances in Commodity Markets (QMUL) Charoula Daskalaki (Piraeus), Alex Kostakis (MBS) and George Skiadopoulos (Piraeus & QMUL)

More information

University of California Berkeley

University of California Berkeley University of California Berkeley A Comment on The Cross-Section of Volatility and Expected Returns : The Statistical Significance of FVIX is Driven by a Single Outlier Robert M. Anderson Stephen W. Bianchi

More information

Variance clustering. Two motivations, volatility clustering, and implied volatility

Variance clustering. Two motivations, volatility clustering, and implied volatility Variance modelling The simplest assumption for time series is that variance is constant. Unfortunately that assumption is often violated in actual data. In this lecture we look at the implications of time

More information

The Free Cash Flow and Corporate Returns

The Free Cash Flow and Corporate Returns Utah State University DigitalCommons@USU All Graduate Plan B and other Reports Graduate Studies 12-2018 The Free Cash Flow and Corporate Returns Sen Na Utah State University Follow this and additional

More information

Information Release and the Fit of the Fama-French Model

Information Release and the Fit of the Fama-French Model Information Release and the Fit of the Fama-French Model Thomas Gilbert Christopher Hrdlicka Avraham Kamara Michael G. Foster School of Business University of Washington April 25, 2014 Risk and Return

More information

Management Science Letters

Management Science Letters Management Science Letters 3 (2013) 1133 1138 Contents lists available at GrowingScience Management Science Letters homepage: www.growingscience.com/msl Earnings quality measures and excess returns: A

More information

Decimalization and Illiquidity Premiums: An Extended Analysis

Decimalization and Illiquidity Premiums: An Extended Analysis Utah State University DigitalCommons@USU All Graduate Plan B and other Reports Graduate Studies 5-2015 Decimalization and Illiquidity Premiums: An Extended Analysis Seth E. Williams Utah State University

More information

A Unified Theory of Bond and Currency Markets

A Unified Theory of Bond and Currency Markets A Unified Theory of Bond and Currency Markets Andrey Ermolov Columbia Business School April 24, 2014 1 / 41 Stylized Facts about Bond Markets US Fact 1: Upward Sloping Real Yield Curve In US, real long

More information

ECON FINANCIAL ECONOMICS

ECON FINANCIAL ECONOMICS ECON 337901 FINANCIAL ECONOMICS Peter Ireland Boston College Fall 2017 These lecture notes by Peter Ireland are licensed under a Creative Commons Attribution-NonCommerical-ShareAlike 4.0 International

More information

Validation of Fama French Model in Indian Capital Market

Validation of Fama French Model in Indian Capital Market Validation of Fama French Model in Indian Capital Market Validation of Fama French Model in Indian Capital Market Asheesh Pandey 1 and Amiya Kumar Mohapatra 2 1 Professor of Finance, Fortune Institute

More information

Some Features of the Three- and Four- -factor Models for the Selected Portfolios of the Stocks Listed on the Warsaw Stock Exchange,

Some Features of the Three- and Four- -factor Models for the Selected Portfolios of the Stocks Listed on the Warsaw Stock Exchange, Some Features of the Three- and Four- -factor Models for the Selected Portfolios of the Stocks Listed on the Warsaw Stock Exchange, 2003 2007 Wojciech Grabowski, Konrad Rotuski, Department of Banking and

More information

ECON FINANCIAL ECONOMICS

ECON FINANCIAL ECONOMICS ECON 337901 FINANCIAL ECONOMICS Peter Ireland Boston College Spring 2018 These lecture notes by Peter Ireland are licensed under a Creative Commons Attribution-NonCommerical-ShareAlike 4.0 International

More information

Liquidity and Asset Pricing. Evidence on the role of Investor Holding Period.

Liquidity and Asset Pricing. Evidence on the role of Investor Holding Period. Liquidity and Asset Pricing. Evidence on the role of Investor Holding Period. Randi Næs Norges Bank Bernt Arne Ødegaard Norges Bank and Norwegian School of Management BI Third workshop on Market Microstructure

More information

Predictability of Stock Returns

Predictability of Stock Returns Predictability of Stock Returns Ahmet Sekreter 1 1 Faculty of Administrative Sciences and Economics, Ishik University, Iraq Correspondence: Ahmet Sekreter, Ishik University, Iraq. Email: ahmet.sekreter@ishik.edu.iq

More information

Behavioral finance has received a great

Behavioral finance has received a great IIJ-JOI-WRIGHT 11/4/08 8:39 PM Page 1 COLBY WRIGHT is an assistant professor of finance at the department of finance and law, College of Business Administration, Central Michigan University in Mt. Pleasant,

More information

22 April Estimates of the Cost of Equity A report for WAGN

22 April Estimates of the Cost of Equity A report for WAGN 22 April 2009 Estimates of the Cost of Equity A report for WAGN Proect Team Simon Wheatley Brendan Quach NERA Economic Consulting Darling Park Tower 3 201 Sussex Street Sydney NSW 2000 Tel: +61 2 8864

More information

Supplementary Material and Data for Catering Through Nominal Share Prices. Malcolm Baker, Robin Greenwood, and Jeffrey Wurgler October 1, 2008

Supplementary Material and Data for Catering Through Nominal Share Prices. Malcolm Baker, Robin Greenwood, and Jeffrey Wurgler October 1, 2008 Supplementary Material and Data for Catering Through Nominal Share Prices Malcolm Baker, Robin Greenwood, and Jeffrey Wurgler October, 2008 Table A. Data table: Raw Market-to-Book Data. The market-to-book

More information

Factor Investing and the Management of the Norwegian Sovereign Wealth Fund

Factor Investing and the Management of the Norwegian Sovereign Wealth Fund Factor Investing and the Management of the Norwegian Sovereign Wealth Fund Stephen M Schaefer London Business School investmentforum Salzburg 19 April 2018 GPFG: Performance Measurement in Norway s Government

More information

Does Mutual Fund Performance Vary over the Business Cycle?

Does Mutual Fund Performance Vary over the Business Cycle? Does Mutual Fund Performance Vary over the Business Cycle? Anthony W. Lynch New York University and NBER Jessica A. Wachter University of Pennsylvania and NBER First Version: 15 November 2002 Current Version:

More information

The Capital Asset Pricing Model

The Capital Asset Pricing Model INTRO TO PORTFOLIO RISK MANAGEMENT IN PYTHON The Capital Asset Pricing Model Dakota Wixom Quantitative Analyst QuantCourse.com The Founding Father of Asset Pricing Models CAPM The Capital Asset Pricing

More information

Debt/Equity Ratio and Asset Pricing Analysis

Debt/Equity Ratio and Asset Pricing Analysis Utah State University DigitalCommons@USU All Graduate Plan B and other Reports Graduate Studies Summer 8-1-2017 Debt/Equity Ratio and Asset Pricing Analysis Nicholas Lyle Follow this and additional works

More information

Discount Rates. John H. Cochrane. January 8, University of Chicago Booth School of Business

Discount Rates. John H. Cochrane. January 8, University of Chicago Booth School of Business Discount Rates John H. Cochrane University of Chicago Booth School of Business January 8, 2011 Discount rates 1. Facts: How risk discount rates vary over time and across assets. 2. Theory: Why discount

More information

What factors affect the Oslo Stock Exchange?

What factors affect the Oslo Stock Exchange? What factors affect the Oslo Stock Exchange? Randi Næs, Johannes A. Skjeltorp and Bernt Arne Ødegaard November 2009 Abstract This paper analyzes return patterns and determinants at the Oslo Stock Exchange

More information

Market timing with aggregate accruals

Market timing with aggregate accruals Original Article Market timing with aggregate accruals Received (in revised form): 22nd September 2008 Qiang Kang is Assistant Professor of Finance at the University of Miami. His research interests focus

More information

In Search of Distress Risk

In Search of Distress Risk In Search of Distress Risk John Y. Campbell, Jens Hilscher, and Jan Szilagyi Presentation to Third Credit Risk Conference: Recent Advances in Credit Risk Research New York, 16 May 2006 What is financial

More information

Hedging Factor Risk Preliminary Version

Hedging Factor Risk Preliminary Version Hedging Factor Risk Preliminary Version Bernard Herskovic, Alan Moreira, and Tyler Muir March 15, 2018 Abstract Standard risk factors can be hedged with minimal reduction in average return. This is true

More information

Stock price synchronicity and the role of analyst: Do analysts generate firm-specific vs. market-wide information?

Stock price synchronicity and the role of analyst: Do analysts generate firm-specific vs. market-wide information? Stock price synchronicity and the role of analyst: Do analysts generate firm-specific vs. market-wide information? Yongsik Kim * Abstract This paper provides empirical evidence that analysts generate firm-specific

More information

What is the Expected Return on a Stock?

What is the Expected Return on a Stock? What is the Expected Return on a Stock? Ian Martin Christian Wagner November, 2017 Martin & Wagner (LSE & CBS) What is the Expected Return on a Stock? November, 2017 1 / 38 What is the expected return

More information

Time-variation of CAPM betas across market volatility regimes for Book-to-market and Momentum portfolios

Time-variation of CAPM betas across market volatility regimes for Book-to-market and Momentum portfolios Time-variation of CAPM betas across market volatility regimes for Book-to-market and Momentum portfolios Azamat Abdymomunov James Morley Department of Economics Washington University in St. Louis October

More information

Internet Appendix to Leverage Constraints and Asset Prices: Insights from Mutual Fund Risk Taking

Internet Appendix to Leverage Constraints and Asset Prices: Insights from Mutual Fund Risk Taking Internet Appendix to Leverage Constraints and Asset Prices: Insights from Mutual Fund Risk Taking In this Internet Appendix, we provide further discussion and additional empirical results to evaluate robustness

More information

Do Investors Understand Really Dirty Surplus?

Do Investors Understand Really Dirty Surplus? Do Investors Understand Really Dirty Surplus? Ken Peasnell CFA UK Society Masterclass, 19 October 2010 Do Investors Understand Really Dirty Surplus? Wayne Landsman (UNC Chapel Hill), Bruce Miller (UCLA),

More information

Hidden in Plain Sight: Equity Price Discovery with Informed Private Debt

Hidden in Plain Sight: Equity Price Discovery with Informed Private Debt Hidden in Plain Sight: Equity Price Discovery with Informed Private Debt Jawad M. Addoum 1 Justin R. Murfin 2 1 Cornell University 2 Yale University Chicago Financial Institutions Conference 2018 April

More information

Betting Against Beta

Betting Against Beta Betting Against Beta Andrea Frazzini AQR Capital Management LLC Lasse H. Pedersen NYU, CEPR, and NBER Copyright 2010 by Andrea Frazzini and Lasse H. Pedersen The views and opinions expressed herein are

More information

Testing The Fama-French Five-Factor Model In Explaining Stock Returns Variation At The Lusaka Securities Exchange

Testing The Fama-French Five-Factor Model In Explaining Stock Returns Variation At The Lusaka Securities Exchange Testing The Fama-French Five-Factor Model In Explaining Stock Returns Variation At The Lusaka Securities Exchange (Conference ID: CFP/150/2017) Nsama Njebele Department of Business Studies Mulungushi University

More information

Industry Indices in Event Studies. Joseph M. Marks Bentley University, AAC Forest Street Waltham, MA

Industry Indices in Event Studies. Joseph M. Marks Bentley University, AAC Forest Street Waltham, MA Industry Indices in Event Studies Joseph M. Marks Bentley University, AAC 273 175 Forest Street Waltham, MA 02452-4705 jmarks@bentley.edu Jim Musumeci* Bentley University, 107 Morrison 175 Forest Street

More information

Empirics of the Oslo Stock Exchange. Basic, descriptive, results.

Empirics of the Oslo Stock Exchange. Basic, descriptive, results. Empirics of the Oslo Stock Exchange. Basic, descriptive, results. Bernt Arne Ødegaard University of Stavanger and Norges Bank July 2009 We give some basic empirical characteristics of the Oslo Stock Exchange

More information