Multivariate State Space Models: Applications

Size: px
Start display at page:

Download "Multivariate State Space Models: Applications"

Transcription

1 Multivariate State Space Models: Applications Sebastian Fossati University of Alberta

2 Application I: Clark (1989) Clark (1987) considered the UC-ARMA(2,0) model y t = µ t + C t µ t = d t 1 + µ t 1 + ε t, ε t iid N(0, σε) 2 d t = d t 1 + ω t, ω t iid N(0, σω) 2 C t = φ 1 C t 1 + φ 2 C t 2 + η t, η t iid N(0, ση) 2 where ε t, ω t, and η t are independent white noise processes. Clark (1989) considered a bivariate unobserved components model for real output and unemployment where a single unobservable component is assumed to explain the stationary movement in both real output and unemployment. 2 / 28

3 Bivariate UC-0 Model The UC-0 model for real output y t = µ t + C t µ t = d + µ t 1 + ε t, ε t iid N(0, σε) 2 C t = φ 1 C t 1 + φ 2 C t 2 + η t, η t iid N(0, ση) 2 The UC-0 model for the unemployment rate u t = α 0 C t + α 1 C t 1 + τ t + ν t, ν t iid N(0, σν) 2 τ t = τ t 1 + ω t, ω t iid N(0, σω) 2 ε t, η t, ν t, and ω t are independent white noise processes. Note that the cyclical component of unemployment, u t, is α 0 C t + α 1 C t 1 (Okun s Law). 3 / 28

4 Bivariate UC-0 Model in SS Form Define θ t = (µ t, d t, C t, C t 1, τ t ). Then the transition equation is µ t µ t 1 ε t d t d t 1 0 C t = 0 0 φ 1 φ 2 0 C t 1 + η t C t C t 2 0 τ t τ t 1 ω t That is G = φ 1 φ , W t = σε ση σω 2 4 / 28

5 Bivariate UC-0 Model in SS Form The measurement is ( ) y t = y t u t = ( with θ t = (µ t, d t, C t, C t 1, τ t ) α 0 α 1 1 ) θ t + ( 0 ν t ) That is F t = ( α 0 α 1 1 ), V t = ( σν 2 ) 5 / 28

6 Bivariate UC-0 Model in SS Form > ssm1 <- function(parm){ + parm <- parm_rest(parm) + + F.mat <- matrix(rep(0,10),nr=2) + F.mat[1,c(1,3)] <- F.mat[2,5] <- 1 + F.mat[2,3:4] <- parm[6:7] + V.mat <- diag(c(1e-07,parm[8])) + G.mat <- matrix(rep(0,25),nr=5) + G.mat[1,1:2] <- G.mat[2,2] <- G.mat[4,3] <- G.mat[5,5] <- 1 + G.mat[3,3:4] <- parm[1:2] + W.mat <- diag(c(parm[4],0,parm[3],0,parm[5])) + + m0.mat <- matrix(rep(0,5),nr=5) + C0.mat <- diag(5)*10^7 + + return( dlm(ff=f.mat,v=v.mat,gg=g.mat,w=w.mat, + m0=m0.mat,c0=c0.mat) ) + } 6 / 28

7 Bivariate UC0 Estimates > # estimate parameters > parm.start <- c(1.53,-.57, , ,-1,-.34,-.16, ) > fit1 <- dlmmle(y=yy,parm=parm.start,build=ssm1,hessian=t) > mod1 <- ssm1(fit1$par) > > # filter and smooth > mod1f <- dlmfilter(yy,mod1); mod1s <- dlmsmooth(mod1f) > > # get parameter estimates > drift <- mod1f$m[nobs+1,2] > covar <- dlmsvd2var(mod1f$u.c[[nobs+1]],mod1f$d.c[nobs+1,]) > coef.se <- sqrt(covar[2,2]) > drift; coef.se [1] [1] / 28

8 Get Filtered Trend and Cycle Estimates Since θ t = (µ t, d t, C t, C t 1, τ t ), the trend and cycle of real output are the first and third elements of the filtered estimates of θ t, respectively. The trend of the unemployment rate is the last element of the filtered estimates of θ t. > # smoothed values > yt.trend <- ts(mod1s$s[-1,1],start=1948,frequency=4) > yt.cycle <- ts(mod1s$s[-1,3],start=1948,frequency=4) > ut.trend <- ts(mod1s$s[-1,5],start=1948,frequency=4) > ut.cycle <- ut - ut.trend 8 / 28

9 Trend and Cycle Decomposition of Real Output > # yt: plot filtered states (trend and cycle) > plot(yt.cycle,ylim=c(-10,7),xlim=c(1948,2011)) > abline(h=0) > plot(cbind(yt,yt.trend),ylim=c(740,960),xlim=c(1948,2011), + plot.type= s,col=c("black","blue")) Cycle Log Real US GDP and Trend / 28

10 Trend and Cycle Decomposition of Unemployment > # ut: plot smoothed state (trend and cycle) > plot(ut.cycle,ylim=c(-4,5),xlim=c(1948,2011)) > abline(h=0) > plot(cbind(ut,ut.trend),ylim=c(0,12),xlim=c(1948,2011), + plot.type= s,col=c("black","blue")) Cycle Unemployment Rate and Trend / 28

11 The Correlated UC Model Sinclair (2009) considered a bivariate UC model where the unobserved innovations are allowed to be correlated. The model for real output and the unemployment rate is y t = µ 1t + C 1t µ 1t = d 1 + µ 1t 1 + ε 1t, ε 1t iid N(0, σ 2 ε 1 ) C 1t = φ 11 C 1t 1 + φ 21 C 1t 2 + η 1t, η 1t iid N(0, σ 2 η 1 ) u t = µ 2t + C 2t µ 2t = µ 2t 1 + ε 2t, ε 2t iid N(0, σε 2 2 ) C 2t = φ 12 C 2t 1 + φ 22 C 2t 2 + η 2t, η 2t iid N(0, ση 2 2 ) ε 1t, η 1t, ε 2t, and η 2t, are allowed to be correlated processes. 11 / 28

12 Application II: Bivariate Random Walk Plus Noise Consider the simple model y 1t = θ t + v 1t, v 1t iid N(0, σv 2 1 ) y 2t = θ t + v 2t, v 2t iid N(0, σv 2 2 ) θ t = θ t 1 + w t, w t iid N(0, σw 2 ) v 1t, v 2t, and w t are independent white noise processes. In this model, the observed variables y 1t and y 2t are the sum of two unobserved components, θ t and v it for i = 1, / 28

13 Bivariate RW + Noise Model in SS Form The transition equation is θ t = θ t 1 + w t The measurement is ( ) y t = y 1t y 2t = ( 1 1 ) θ t + ( v 1t v 2t ) That is G t = 1, W t = σ 2 w, F t = ( 1 1 ), V t = ( σ 2 v σ 2 v 2 ) 13 / 28

14 Simulated Bivariate RW + Noise > # simulate random walk + noise processes > nobs <- 250 > v1t <- sqrt(3)*rnorm(nobs) # var(v) = 3 > v2t <- sqrt(2)*rnorm(nobs) # var(v) = 2 > wt <- sqrt(.5)*rnorm(nobs) # var(w) =.5 > > # simulate time series > xt <- rep(0,nobs) > xt[1] <- wt[1] > for(i in 2:nobs){ xt[i] <- xt[i-1]+wt[i] } > y1t <- as.ts(xt+v1t) > y2t <- as.ts(xt+v2t) > yy <- cbind(y1t,y2t) 14 / 28

15 Simulated Bivariate RW + Noise y1t xt y2t xt / 28

16 Bivariate RW + Noise Model in SS Form > ssm2 <- function(parm){ + parm <- parm_rest(parm) + + F.mat <- matrix(rep(1,2),nr=2) + V.mat <- diag(c(parm[1],parm[2])) + G.mat <- 1 + W.mat <- parm[3] + + m0.mat <- 0 + C0.mat <- 10^7 + + return( dlm(ff=f.mat,v=v.mat,gg=g.mat,w=w.mat, + m0=m0.mat,c0=c0.mat) ) + } 16 / 28

17 Bivariate RW + Noise Estimates > # estimate parameters > fit2 <- dlmmle(y=yy,parm=c(0,0,0),build=ssm2,hessian=t) > mod2 <- ssm2(fit2$par) > > # get estimates > coef <- parm_rest(fit2$par) > # get standard errors using delta method > jac <- jacobian(func=parm_rest,x=fit2$par) > var <- jac%*%solve(fit2$hessian)%*%t(jac) > # print results > coef; sqrt(diag(var)) [1] [1] > 17 / 28

18 Filter and Smooth > # filter and smooth > mod2f <- dlmfilter(yy,mod2); mod2s <- dlmsmooth(mod2f) > > # get smoothed estimates and standard errors > # smoothed values > xt.s <- ts(mod2s$s[-1],start=1) > # width of 90% confidence interval > se.s <- dlmsvd2var(mod2s$u.s,mod2s$d.s)[-1] > width <- qnorm(.95)*sqrt(sapply(se.s,diag)) > # put smoothed results together > xt.smoothed <- cbind(xt.s,as.vector(xt.s)+width%o%c(1,-1)) 18 / 28

19 Estimated RW y1t xt.s y2t xt.s / 28

20 Application III: Dynamic Factor Models Let y t be a T N panel of macroeconomic indicators where y it, i = 1,..., N, t = 1,..., T, has a factor structure of the form y it = λ i (L)g t + e it where g t is an unobserved dynamic factor, λ i (L) = λ i0 + λ i1 L λ is L s, λ ij are the dynamic factor loadings, and e it is the idiosyncratic error. The dynamics of the latent factor and the idiosyncratic errors are driven by autoregressive processes such that φ(l)g t = η t, η t iid N(0, σ 2 g ) ψ i (L)e it = ν it, ν it iid N(0, σ 2 i ) where φ(l) and ψ i (L) are polynomials in L of orders p g and p e, respectively. 20 / 28

21 A Real Activity Dynamic Factor Stock and Watson (1991) construct an index of business conditions based on a data set of 4 real activity indicators: industrial production, personal income less transfer payments, real manufacturing trade and sales, and employment. See also Aruoba, Diebold, and Scotti (2009) and Fossati (2012). For example, Fossati (2012) considers the model y it = λ i g t + e it g t = φ 1 g t 1 + φ 2 g t 2 + η t, η t iid N(0, σg 2 ) e it = ψ i1 e it 1 + ψ i2 e it 2 + ν it, ν it iid N(0, σi 2 ) Identification is achieved by setting σg 2 = 1. The dynamic factor models are usually estimated with the data transformed to ensure stationarity, and standardized prior to estimation. 21 / 28

22 Dynamic Factor Model in SS Form Define θ t = (g t, g t 1, e 1t, e 1t 1,..., e 4t, e 4t 1 ). The transition equation is θ t = Gθ t 1 + w t That is G = φ 1 φ ψ 11 ψ ψ 41 ψ , w t = η t 0 v 1t 0. v 4t 0 and W = diag ( 1, 0, σ 2 1, 0,..., 0, σ 2 4, 0 ) 22 / 28

23 Dynamic Factor Model in SS Form The measurement is y t = y 1t y 2t y 3t y 4t = F θ t with θ t = (g t, g t 1, e 1t, e 1t 1,..., e 4t, e 4t 1 ). That is F = λ λ λ λ , V t = / 28

24 Estimate A Real Activity Factor for the US Economy A sample of the four monthly coincident indicators for 1960:1-2010:12 can be found in the file coinc.txt. The data is already transformed to ensure stationarity (log-differenced). As it is standard, the data is standardized prior to estimation. > # load coincident indicators > data <-read.table("coinc.txt",sep="",header=false) > yt <- ts(data,start=1960,frequency=12) > # load NBER recession dates > data <-read.table("nber_dates.txt",sep="",header=false) > nber <- ts(data$v1,start=1961,frequency=12) > > # standardize data to improve convergence > yy <- scale(yt) 24 / 28

25 Real Activity Factor Since θ t = (g t, g t 1, e 1t, e 1t 1,..., e 4t, e 4t 1 ), the dynamic factor is the first element of the filtered estimates of θ t. Note that major troughs correspond closely to NBER recession dates. df.f / 28

26 Factor-Augmented Probit Regression Define a latent variable x t, which represents the state of the economy as measured by the Business Cycle Dating Committee of the NBER, such that x t = α + δĝ t + ɛ t, ɛ t ĝ t iid N(0, 1) We do not observe x t but rather NBER t NBER t = 1(x t 0) where NBER t is 1 if the observation corresponds to a recession and 0 otherwise. This is a standard probit model. The conditional probability of recession is given by p t = P(NBER t = 1 ĝ t ) = P(x t 0 ĝ t ) = Φ(α + δĝ t ) where Φ( ) is the distribution function of the standard normal. 26 / 28

27 Estimated Recession Probabilities > # plot recession probabilities > plot(probs,ylim=c(0,1),xlim=c(1961,2011)) > nbershade() > lines(probs) > abline(h=0) probs / 28

28 Evaluation of Recession Probabilities The quadratic probability score (QPS) mat be used to evaluate the predicted recession probabilities. QPS = 1 T T (NBER t ˆp t ) 2 t=1 The QPS can take values from 0 to 1. Smaller QPS values indicate more accurate predictions. > # compute QPS (only interesting for model comparison) > qps <- mean((nber-probs)^2) > qps [1] > 28 / 28

Univariate Nonstationary Time Series 1

Univariate Nonstationary Time Series 1 Univariate Nonstationary Time Series 1 Sebastian Fossati University of Alberta 1 These slides are based on Eric Zivot s time series notes available at: http://faculty.washington.edu/ezivot Introduction

More information

State-space Model. Eduardo Rossi University of Pavia. November Rossi State-space Model Fin. Econometrics / 53

State-space Model. Eduardo Rossi University of Pavia. November Rossi State-space Model Fin. Econometrics / 53 State-space Model Eduardo Rossi University of Pavia November 2014 Rossi State-space Model Fin. Econometrics - 2014 1 / 53 Outline 1 Motivation 2 Introduction 3 The Kalman filter 4 Forecast errors 5 State

More information

Time-Varying Parameters

Time-Varying Parameters Kalman Filter and state-space models: time-varying parameter models; models with unobservable variables; basic tool: Kalman filter; implementation is task-specific. y t = x t β t + e t (1) β t = µ + Fβ

More information

Dynamic linear models (aka state-space models) 1

Dynamic linear models (aka state-space models) 1 Dynamic linear models (aka state-space models) 1 Advanced Econometris: Time Series Hedibert Freitas Lopes INSPER 1 Part of this lecture is based on Gamerman and Lopes (2006) Markov Chain Monte Carlo: Stochastic

More information

Model-based trend-cycle decompositions. with time-varying parameters

Model-based trend-cycle decompositions. with time-varying parameters Model-based trend-cycle decompositions with time-varying parameters Siem Jan Koopman Kai Ming Lee Soon Yip Wong s.j.koopman@ klee@ s.wong@ feweb.vu.nl Department of Econometrics Vrije Universiteit Amsterdam

More information

Class: Trend-Cycle Decomposition

Class: Trend-Cycle Decomposition Class: Trend-Cycle Decomposition Macroeconometrics - Spring 2011 Jacek Suda, BdF and PSE June 1, 2011 Outline Outline: 1 Unobserved Component Approach 2 Beveridge-Nelson Decomposition 3 Spectral Analysis

More information

State-space Model. Eduardo Rossi University of Pavia. November Rossi State-space Model Financial Econometrics / 49

State-space Model. Eduardo Rossi University of Pavia. November Rossi State-space Model Financial Econometrics / 49 State-space Model Eduardo Rossi University of Pavia November 2013 Rossi State-space Model Financial Econometrics - 2013 1 / 49 Outline 1 Introduction 2 The Kalman filter 3 Forecast errors 4 State smoothing

More information

CENTRE FOR APPLIED MACROECONOMIC ANALYSIS

CENTRE FOR APPLIED MACROECONOMIC ANALYSIS CENTRE FOR APPLIED MACROECONOMIC ANALYSIS The Australian National University CAMA Working Paper Series May, 2005 SINGLE SOURCE OF ERROR STATE SPACE APPROACH TO THE BEVERIDGE NELSON DECOMPOSITION Heather

More information

A Test for State-Dependent Predictive Ability based on a Markov-Switching Framework

A Test for State-Dependent Predictive Ability based on a Markov-Switching Framework A Test for State-Dependent Predictive Ability based on a Markov-Switching Framework Sebastian Fossati University of Alberta This version: May 17, 2018 Abstract This paper proposes a new test for comparing

More information

A multivariate innovations state space Beveridge Nelson decomposition

A multivariate innovations state space Beveridge Nelson decomposition MPRA Munich Personal RePEc Archive A multivariate innovations state space Beveridge Nelson decomposition de Silva, Ashton RMIT University October 2007 Online at http://mpra.ub.uni-muenchen.de/5431/ MPRA

More information

A Comparison of Business Cycle Regime Nowcasting Performance between Real-time and Revised Data. By Arabinda Basistha (West Virginia University)

A Comparison of Business Cycle Regime Nowcasting Performance between Real-time and Revised Data. By Arabinda Basistha (West Virginia University) A Comparison of Business Cycle Regime Nowcasting Performance between Real-time and Revised Data By Arabinda Basistha (West Virginia University) This version: 2.7.8 Markov-switching models used for nowcasting

More information

9) Time series econometrics

9) Time series econometrics 30C00200 Econometrics 9) Time series econometrics Timo Kuosmanen Professor Management Science http://nomepre.net/index.php/timokuosmanen 1 Macroeconomic data: GDP Inflation rate Examples of time series

More information

Lecture 19 - Decomposing a Time Series into its Trend and Cyclical Components

Lecture 19 - Decomposing a Time Series into its Trend and Cyclical Components Lecture 19 - Decomposing a Time Series into its Trend and Cyclical Components It is often assumed that many macroeconomic time series are subject to two sorts of forces: those that influence the long-run

More information

Trend-Cycle Decompositions

Trend-Cycle Decompositions Trend-Cycle Decompositions Eric Zivot April 22, 2005 1 Introduction A convenient way of representing an economic time series y t is through the so-called trend-cycle decomposition y t = TD t + Z t (1)

More information

Consider the trend-cycle decomposition of a time series y t

Consider the trend-cycle decomposition of a time series y t 1 Unit Root Tests Consider the trend-cycle decomposition of a time series y t y t = TD t + TS t + C t = TD t + Z t The basic issue in unit root testing is to determine if TS t = 0. Two classes of tests,

More information

1. Shocks. This version: February 15, Nr. 1

1. Shocks. This version: February 15, Nr. 1 1. Shocks This version: February 15, 2006 Nr. 1 1.3. Factor models What if there are more shocks than variables in the VAR? What if there are only a few underlying shocks, explaining most of fluctuations?

More information

Chapter 3 - Temporal processes

Chapter 3 - Temporal processes STK4150 - Intro 1 Chapter 3 - Temporal processes Odd Kolbjørnsen and Geir Storvik January 23 2017 STK4150 - Intro 2 Temporal processes Data collected over time Past, present, future, change Temporal aspect

More information

Switching Regime Estimation

Switching Regime Estimation Switching Regime Estimation Series de Tiempo BIrkbeck March 2013 Martin Sola (FE) Markov Switching models 01/13 1 / 52 The economy (the time series) often behaves very different in periods such as booms

More information

The Clark Model with Correlated Components

The Clark Model with Correlated Components The Clark Model with Correlated Components Kum Hwa Oh and Eric Zivot January 16, 2006 Abstract This paper is an extension of Why are the Beveridge-Nelson and Unobserved- Components Decompositions of GDP

More information

Permanent Income Hypothesis (PIH) Instructor: Dmytro Hryshko

Permanent Income Hypothesis (PIH) Instructor: Dmytro Hryshko Permanent Income Hypothesis (PIH) Instructor: Dmytro Hryshko 1 / 36 The PIH Utility function is quadratic, u(c t ) = 1 2 (c t c) 2 ; borrowing/saving is allowed using only the risk-free bond; β(1 + r)

More information

The Functional Central Limit Theorem and Testing for Time Varying Parameters

The Functional Central Limit Theorem and Testing for Time Varying Parameters NBER Summer Institute Minicourse What s New in Econometrics: ime Series Lecture : July 4, 008 he Functional Central Limit heorem and esting for ime Varying Parameters Lecture -, July, 008 Outline. FCL.

More information

July 31, 2009 / Ben Kedem Symposium

July 31, 2009 / Ben Kedem Symposium ing The s ing The Department of Statistics North Carolina State University July 31, 2009 / Ben Kedem Symposium Outline ing The s 1 2 s 3 4 5 Ben Kedem ing The s Ben has made many contributions to time

More information

5 Transfer function modelling

5 Transfer function modelling MSc Further Time Series Analysis 5 Transfer function modelling 5.1 The model Consider the construction of a model for a time series (Y t ) whose values are influenced by the earlier values of a series

More information

Technical appendices: Business cycle accounting for the Japanese economy using the parameterized expectations algorithm

Technical appendices: Business cycle accounting for the Japanese economy using the parameterized expectations algorithm Technical appendices: Business cycle accounting for the Japanese economy using the parameterized expectations algorithm Masaru Inaba November 26, 2007 Introduction. Inaba (2007a) apply the parameterized

More information

FACULTEIT ECONOMIE EN BEDRIJFSKUNDE. TWEEKERKENSTRAAT 2 B-9000 GENT Tel. : 32 - (0) Fax. : 32 - (0)

FACULTEIT ECONOMIE EN BEDRIJFSKUNDE. TWEEKERKENSTRAAT 2 B-9000 GENT Tel. : 32 - (0) Fax. : 32 - (0) FACULTEIT ECONOMIE EN BEDRIJFSKUNDE TWEEKERKENSTRAAT 2 B-9000 GENT Tel. : 32 - (0)9 264.34.61 Fax. : 32 - (0)9 264.35.92 WORKING PAPER Estimating Long-Run Relationships between Observed Integrated Variables

More information

Time Series Analysis -- An Introduction -- AMS 586

Time Series Analysis -- An Introduction -- AMS 586 Time Series Analysis -- An Introduction -- AMS 586 1 Objectives of time series analysis Data description Data interpretation Modeling Control Prediction & Forecasting 2 Time-Series Data Numerical data

More information

MODELING INFLATION RATES IN NIGERIA: BOX-JENKINS APPROACH. I. U. Moffat and A. E. David Department of Mathematics & Statistics, University of Uyo, Uyo

MODELING INFLATION RATES IN NIGERIA: BOX-JENKINS APPROACH. I. U. Moffat and A. E. David Department of Mathematics & Statistics, University of Uyo, Uyo Vol.4, No.2, pp.2-27, April 216 MODELING INFLATION RATES IN NIGERIA: BOX-JENKINS APPROACH I. U. Moffat and A. E. David Department of Mathematics & Statistics, University of Uyo, Uyo ABSTRACT: This study

More information

Time Series Solutions HT 2009

Time Series Solutions HT 2009 Time Series Solutions HT 2009 1. Let {X t } be the ARMA(1, 1) process, X t φx t 1 = ɛ t + θɛ t 1, {ɛ t } WN(0, σ 2 ), where φ < 1 and θ < 1. Show that the autocorrelation function of {X t } is given by

More information

Time Series Analysis

Time Series Analysis Time Series Analysis hm@imm.dtu.dk Informatics and Mathematical Modelling Technical University of Denmark DK-2800 Kgs. Lyngby 1 Outline of the lecture Chapter 9 Multivariate time series 2 Transfer function

More information

State Space Model, Official Statistics, Bayesian Statistics Introduction to Durbin s paper and related topics

State Space Model, Official Statistics, Bayesian Statistics Introduction to Durbin s paper and related topics State Space Model, Official Statistics, Bayesian Statistics Introduction to Durbin s paper and related topics Yasuto Yoshizoe Aoyama Gakuin University yoshizoe@econ.aoyama.ac.jp yasuto yoshizoe@post.harvard.edu

More information

Forecasting Based on Common Trends in Mixed Frequency Samples

Forecasting Based on Common Trends in Mixed Frequency Samples Forecasting Based on Common Trends in Mixed Frequency Samples Peter Fuleky and Carl S. Bonham June 2, 2011 Abstract We extend the existing literature on small mixed frequency single factor models by allowing

More information

Estimating and Accounting for the Output Gap with Large Bayesian Vector Autoregressions

Estimating and Accounting for the Output Gap with Large Bayesian Vector Autoregressions Estimating and Accounting for the Output Gap with Large Bayesian Vector Autoregressions James Morley 1 Benjamin Wong 2 1 University of Sydney 2 Reserve Bank of New Zealand The view do not necessarily represent

More information

A Practical Guide to State Space Modeling

A Practical Guide to State Space Modeling A Practical Guide to State Space Modeling Jin-Lung Lin Institute of Economics, Academia Sinica Department of Economics, National Chengchi University March 006 1 1 Introduction State Space Model (SSM) has

More information

Appendix A: The time series behavior of employment growth

Appendix A: The time series behavior of employment growth Unpublished appendices from The Relationship between Firm Size and Firm Growth in the U.S. Manufacturing Sector Bronwyn H. Hall Journal of Industrial Economics 35 (June 987): 583-606. Appendix A: The time

More information

Week 5 Quantitative Analysis of Financial Markets Characterizing Cycles

Week 5 Quantitative Analysis of Financial Markets Characterizing Cycles Week 5 Quantitative Analysis of Financial Markets Characterizing Cycles Christopher Ting http://www.mysmu.edu/faculty/christophert/ Christopher Ting : christopherting@smu.edu.sg : 6828 0364 : LKCSB 5036

More information

B y t = γ 0 + Γ 1 y t + ε t B(L) y t = γ 0 + ε t ε t iid (0, D) D is diagonal

B y t = γ 0 + Γ 1 y t + ε t B(L) y t = γ 0 + ε t ε t iid (0, D) D is diagonal Structural VAR Modeling for I(1) Data that is Not Cointegrated Assume y t =(y 1t,y 2t ) 0 be I(1) and not cointegrated. That is, y 1t and y 2t are both I(1) and there is no linear combination of y 1t and

More information

Time-Varying Vector Autoregressive Models with Structural Dynamic Factors

Time-Varying Vector Autoregressive Models with Structural Dynamic Factors Time-Varying Vector Autoregressive Models with Structural Dynamic Factors Paolo Gorgi, Siem Jan Koopman, Julia Schaumburg http://sjkoopman.net Vrije Universiteit Amsterdam School of Business and Economics

More information

On the Correlations of Trend-Cycle Errors

On the Correlations of Trend-Cycle Errors On the Correlations of Trend-Cycle Errors Tatsuma Wada Wayne State University This version: December 19, 11 Abstract This note provides explanations for an unexpected result, namely, the estimated parameter

More information

News Shocks: Different Effects in Boom and Recession?

News Shocks: Different Effects in Boom and Recession? News Shocks: Different Effects in Boom and Recession? Maria Bolboaca, Sarah Fischer University of Bern Study Center Gerzensee June 7, 5 / Introduction News are defined in the literature as exogenous changes

More information

Structural Time Series Models: theory and application

Structural Time Series Models: theory and application Master thesis for the Master of Environmental and Development Economics Structural Time Series Models: theory and application GDP time series in USA, Euro-area, GBR, Sweden and Japan Yoon Shin Nakstad

More information

ECON/FIN 250: Forecasting in Finance and Economics: Section 6: Standard Univariate Models

ECON/FIN 250: Forecasting in Finance and Economics: Section 6: Standard Univariate Models ECON/FIN 250: Forecasting in Finance and Economics: Section 6: Standard Univariate Models Patrick Herb Brandeis University Spring 2016 Patrick Herb (Brandeis University) Standard Univariate Models ECON/FIN

More information

State Space Model for Coincident and Leading Indexes of Economic Activity

State Space Model for Coincident and Leading Indexes of Economic Activity State Space Model for Coincident and Leading Indexes of Economic Activity July 23, 2008 Preliminary version. Abstract Issler and Vahid (2006) used canonical correlation analysis and the information content

More information

Vector autoregressions, VAR

Vector autoregressions, VAR 1 / 45 Vector autoregressions, VAR Chapter 2 Financial Econometrics Michael Hauser WS17/18 2 / 45 Content Cross-correlations VAR model in standard/reduced form Properties of VAR(1), VAR(p) Structural VAR,

More information

FaMIDAS: A Mixed Frequency Factor Model with MIDAS structure

FaMIDAS: A Mixed Frequency Factor Model with MIDAS structure FaMIDAS: A Mixed Frequency Factor Model with MIDAS structure Frale C., Monteforte L. Computational and Financial Econometrics Limassol, October 2009 Introduction After the recent financial and economic

More information

Introduction to Regression Analysis. Dr. Devlina Chatterjee 11 th August, 2017

Introduction to Regression Analysis. Dr. Devlina Chatterjee 11 th August, 2017 Introduction to Regression Analysis Dr. Devlina Chatterjee 11 th August, 2017 What is regression analysis? Regression analysis is a statistical technique for studying linear relationships. One dependent

More information

Exercises - Time series analysis

Exercises - Time series analysis Descriptive analysis of a time series (1) Estimate the trend of the series of gasoline consumption in Spain using a straight line in the period from 1945 to 1995 and generate forecasts for 24 months. Compare

More information

Class 4: VAR. Macroeconometrics - Fall October 11, Jacek Suda, Banque de France

Class 4: VAR. Macroeconometrics - Fall October 11, Jacek Suda, Banque de France VAR IRF Short-run Restrictions Long-run Restrictions Granger Summary Jacek Suda, Banque de France October 11, 2013 VAR IRF Short-run Restrictions Long-run Restrictions Granger Summary Outline Outline:

More information

X t = a t + r t, (7.1)

X t = a t + r t, (7.1) Chapter 7 State Space Models 71 Introduction State Space models, developed over the past 10 20 years, are alternative models for time series They include both the ARIMA models of Chapters 3 6 and the Classical

More information

11/18/2008. So run regression in first differences to examine association. 18 November November November 2008

11/18/2008. So run regression in first differences to examine association. 18 November November November 2008 Time Series Econometrics 7 Vijayamohanan Pillai N Unit Root Tests Vijayamohan: CDS M Phil: Time Series 7 1 Vijayamohan: CDS M Phil: Time Series 7 2 R 2 > DW Spurious/Nonsense Regression. Integrated but

More information

ECON/FIN 250: Forecasting in Finance and Economics: Section 7: Unit Roots & Dickey-Fuller Tests

ECON/FIN 250: Forecasting in Finance and Economics: Section 7: Unit Roots & Dickey-Fuller Tests ECON/FIN 250: Forecasting in Finance and Economics: Section 7: Unit Roots & Dickey-Fuller Tests Patrick Herb Brandeis University Spring 2016 Patrick Herb (Brandeis University) Unit Root Tests ECON/FIN

More information

Financial Time Series Analysis: Part II

Financial Time Series Analysis: Part II Department of Mathematics and Statistics, University of Vaasa, Finland Spring 2017 1 Unit root Deterministic trend Stochastic trend Testing for unit root ADF-test (Augmented Dickey-Fuller test) Testing

More information

Econometría 2: Análisis de series de Tiempo

Econometría 2: Análisis de series de Tiempo Econometría 2: Análisis de series de Tiempo Karoll GOMEZ kgomezp@unal.edu.co http://karollgomez.wordpress.com Segundo semestre 2016 IX. Vector Time Series Models VARMA Models A. 1. Motivation: The vector

More information

1. Stochastic Processes and Stationarity

1. Stochastic Processes and Stationarity Massachusetts Institute of Technology Department of Economics Time Series 14.384 Guido Kuersteiner Lecture Note 1 - Introduction This course provides the basic tools needed to analyze data that is observed

More information

14 - Gaussian Stochastic Processes

14 - Gaussian Stochastic Processes 14-1 Gaussian Stochastic Processes S. Lall, Stanford 211.2.24.1 14 - Gaussian Stochastic Processes Linear systems driven by IID noise Evolution of mean and covariance Example: mass-spring system Steady-state

More information

Econometrics of Seasonality

Econometrics of Seasonality Based on the book by Ghysels/Osborn: The Econometric Analysis of Seasonal Time Series Robert M. Kunst robert.kunst@univie.ac.at University of Vienna and Institute for Advanced Studies Vienna March 6, 2012

More information

News, Noise, and Fluctuations: An Empirical Exploration

News, Noise, and Fluctuations: An Empirical Exploration News, Noise, and Fluctuations: An Empirical Exploration Olivier J. Blanchard, Jean-Paul L Huillier, Guido Lorenzoni January 2009 Abstract We explore empirically a model of aggregate fluctuations with two

More information

Ch 5. Models for Nonstationary Time Series. Time Series Analysis

Ch 5. Models for Nonstationary Time Series. Time Series Analysis We have studied some deterministic and some stationary trend models. However, many time series data cannot be modeled in either way. Ex. The data set oil.price displays an increasing variation from the

More information

The Dynamic Relationship between Permanent and Transitory Components of U.S. Business Cycles

The Dynamic Relationship between Permanent and Transitory Components of U.S. Business Cycles CHANG-JIN KIM JEREMY M. PIGER RICHARD STARTZ The Dynamic Relationship between Permanent and Transitory Components of U.S. Business Cycles This paper investigates the dynamic relationship between permanent

More information

Chapter 2: Unit Roots

Chapter 2: Unit Roots Chapter 2: Unit Roots 1 Contents: Lehrstuhl für Department Empirische of Wirtschaftsforschung Empirical Research and undeconometrics II. Unit Roots... 3 II.1 Integration Level... 3 II.2 Nonstationarity

More information

Housing and the Business Cycle

Housing and the Business Cycle Housing and the Business Cycle Morris Davis and Jonathan Heathcote Winter 2009 Huw Lloyd-Ellis () ECON917 Winter 2009 1 / 21 Motivation Need to distinguish between housing and non housing investment,!

More information

Functional time series

Functional time series Rob J Hyndman Functional time series with applications in demography 4. Connections, extensions and applications Outline 1 Yield curves 2 Electricity prices 3 Dynamic updating with partially observed functions

More information

Periodic Seasonal Time Series Models with applications to U.S. macroeconomic data

Periodic Seasonal Time Series Models with applications to U.S. macroeconomic data Periodic Seasonal Time Series Models with applications to U.S. macroeconomic data ISBN 978 90 3610 246 9 Cover design: Crasborn Graphic Designers bno, Valkenburg a.d. Geul This book is no. 503 of the Tinbergen

More information

Lecture VIII. Income Process: Facts, Estimation, and Discretization

Lecture VIII. Income Process: Facts, Estimation, and Discretization Lecture VIII Income Process: Facts, Estimation, and Discretization Gianluca Violante New York University Quantitative Macroeconomics G. Violante, Income Process p. 1 /26 Estimation of income process Competitive

More information

Euro-indicators Working Group

Euro-indicators Working Group Euro-indicators Working Group Luxembourg, 9 th & 10 th June 2011 Item 9.4 of the Agenda New developments in EuroMIND estimates Rosa Ruggeri Cannata Doc 309/11 What is EuroMIND? EuroMIND is a Monthly INDicator

More information

Business Cycle Comovements in Industrial Subsectors

Business Cycle Comovements in Industrial Subsectors Business Cycle Comovements in Industrial Subsectors Michael T. Owyang 1 Daniel Soques 2 1 Federal Reserve Bank of St. Louis 2 University of North Carolina Wilmington The views expressed here are those

More information

7. Forecasting with ARIMA models

7. Forecasting with ARIMA models 7. Forecasting with ARIMA models 309 Outline: Introduction The prediction equation of an ARIMA model Interpreting the predictions Variance of the predictions Forecast updating Measuring predictability

More information

Forecasting the term structure interest rate of government bond yields

Forecasting the term structure interest rate of government bond yields Forecasting the term structure interest rate of government bond yields Bachelor Thesis Econometrics & Operational Research Joost van Esch (419617) Erasmus School of Economics, Erasmus University Rotterdam

More information

TIME SERIES ANALYSIS. Forecasting and Control. Wiley. Fifth Edition GWILYM M. JENKINS GEORGE E. P. BOX GREGORY C. REINSEL GRETA M.

TIME SERIES ANALYSIS. Forecasting and Control. Wiley. Fifth Edition GWILYM M. JENKINS GEORGE E. P. BOX GREGORY C. REINSEL GRETA M. TIME SERIES ANALYSIS Forecasting and Control Fifth Edition GEORGE E. P. BOX GWILYM M. JENKINS GREGORY C. REINSEL GRETA M. LJUNG Wiley CONTENTS PREFACE TO THE FIFTH EDITION PREFACE TO THE FOURTH EDITION

More information

TAKEHOME FINAL EXAM e iω e 2iω e iω e 2iω

TAKEHOME FINAL EXAM e iω e 2iω e iω e 2iω ECO 513 Spring 2015 TAKEHOME FINAL EXAM (1) Suppose the univariate stochastic process y is ARMA(2,2) of the following form: y t = 1.6974y t 1.9604y t 2 + ε t 1.6628ε t 1 +.9216ε t 2, (1) where ε is i.i.d.

More information

Stochastic Trends & Economic Fluctuations

Stochastic Trends & Economic Fluctuations Stochastic Trends & Economic Fluctuations King, Plosser, Stock & Watson (AER, 1991) Cesar E. Tamayo Econ508 - Economics - Rutgers November 14, 2011 Cesar E. Tamayo Stochastic Trends & Economic Fluctuations

More information

Constructing a Coincident Index of Business Cycles Without Assuming a One-Factor Model

Constructing a Coincident Index of Business Cycles Without Assuming a One-Factor Model Constructing a Coincident Index of Business Cycles Without Assuming a One-Factor Model Roberto S Mariano Singapore Management University and the University of Pennsylvania Yasutomo Murasawa Osaka Prefecture

More information

Ch. 19 Models of Nonstationary Time Series

Ch. 19 Models of Nonstationary Time Series Ch. 19 Models of Nonstationary Time Series In time series analysis we do not confine ourselves to the analysis of stationary time series. In fact, most of the time series we encounter are non stationary.

More information

Can News be a Major Source of Aggregate Fluctuations?

Can News be a Major Source of Aggregate Fluctuations? Can News be a Major Source of Aggregate Fluctuations? A Bayesian DSGE Approach Ippei Fujiwara 1 Yasuo Hirose 1 Mototsugu 2 1 Bank of Japan 2 Vanderbilt University August 4, 2009 Contributions of this paper

More information

1 Linear Difference Equations

1 Linear Difference Equations ARMA Handout Jialin Yu 1 Linear Difference Equations First order systems Let {ε t } t=1 denote an input sequence and {y t} t=1 sequence generated by denote an output y t = φy t 1 + ε t t = 1, 2,... with

More information

Stat 565. Spurious Regression. Charlotte Wickham. stat565.cwick.co.nz. Feb

Stat 565. Spurious Regression. Charlotte Wickham. stat565.cwick.co.nz. Feb Stat 565 Spurious Regression Feb 16 2016 Charlotte Wickham stat565.cwick.co.nz Last time: We can extend regression to deal with correlated errors. Today: Explore the concept of spurious correlation/regression

More information

Network Connectivity and Systematic Risk

Network Connectivity and Systematic Risk Network Connectivity and Systematic Risk Monica Billio 1 Massimiliano Caporin 2 Roberto Panzica 3 Loriana Pelizzon 1,3 1 University Ca Foscari Venezia (Italy) 2 University of Padova (Italy) 3 Goethe University

More information

THE ROYAL STATISTICAL SOCIETY 2009 EXAMINATIONS SOLUTIONS GRADUATE DIPLOMA MODULAR FORMAT MODULE 3 STOCHASTIC PROCESSES AND TIME SERIES

THE ROYAL STATISTICAL SOCIETY 2009 EXAMINATIONS SOLUTIONS GRADUATE DIPLOMA MODULAR FORMAT MODULE 3 STOCHASTIC PROCESSES AND TIME SERIES THE ROYAL STATISTICAL SOCIETY 9 EXAMINATIONS SOLUTIONS GRADUATE DIPLOMA MODULAR FORMAT MODULE 3 STOCHASTIC PROCESSES AND TIME SERIES The Society provides these solutions to assist candidates preparing

More information

Real Business Cycle Model (RBC)

Real Business Cycle Model (RBC) Real Business Cycle Model (RBC) Seyed Ali Madanizadeh November 2013 RBC Model Lucas 1980: One of the functions of theoretical economics is to provide fully articulated, artificial economic systems that

More information

Lesson 2: Analysis of time series

Lesson 2: Analysis of time series Lesson 2: Analysis of time series Time series Main aims of time series analysis choosing right model statistical testing forecast driving and optimalisation Problems in analysis of time series time problems

More information

Estimating Output Gap, Core Inflation, and the NAIRU for Peru

Estimating Output Gap, Core Inflation, and the NAIRU for Peru BANCO CENTRAL DE RESERVA DEL PERÚ Estimating Output Gap, Core Inflation, and the NAIRU for Peru Gabriel Rodríguez* * Central Reserve Bank of Peru and Pontificia Universidad Católica del Perú DT. N 2009-011

More information

State Space Model for Coincident and Leading Indexes of Economic Activity

State Space Model for Coincident and Leading Indexes of Economic Activity State Space Model for Coincident and Leading Indexes of Economic Activity Rafael Martins de Souza João Victor Issler Getulio Vargas Foundation May 21, 2008 Very preliminary version. Abstract Issler and

More information

The MIT Press Journals

The MIT Press Journals The MIT Press Journals http://mitpress.mit.edu/journals This article is provided courtesy of The MIT Press. To join an e-mail alert list and receive the latest news on our publications, please visit: http://mitpress.mit.edu/e-mail

More information

ECON 4160, Spring term Lecture 12

ECON 4160, Spring term Lecture 12 ECON 4160, Spring term 2013. Lecture 12 Non-stationarity and co-integration 2/2 Ragnar Nymoen Department of Economics 13 Nov 2013 1 / 53 Introduction I So far we have considered: Stationary VAR, with deterministic

More information

Empirical Market Microstructure Analysis (EMMA)

Empirical Market Microstructure Analysis (EMMA) Empirical Market Microstructure Analysis (EMMA) Lecture 3: Statistical Building Blocks and Econometric Basics Prof. Dr. Michael Stein michael.stein@vwl.uni-freiburg.de Albert-Ludwigs-University of Freiburg

More information

Testing an Autoregressive Structure in Binary Time Series Models

Testing an Autoregressive Structure in Binary Time Series Models ömmföäflsäafaäsflassflassflas ffffffffffffffffffffffffffffffffffff Discussion Papers Testing an Autoregressive Structure in Binary Time Series Models Henri Nyberg University of Helsinki and HECER Discussion

More information

Econometrics II Heij et al. Chapter 7.1

Econometrics II Heij et al. Chapter 7.1 Chapter 7.1 p. 1/2 Econometrics II Heij et al. Chapter 7.1 Linear Time Series Models for Stationary data Marius Ooms Tinbergen Institute Amsterdam Chapter 7.1 p. 2/2 Program Introduction Modelling philosophy

More information

10) Time series econometrics

10) Time series econometrics 30C00200 Econometrics 10) Time series econometrics Timo Kuosmanen Professor, Ph.D. 1 Topics today Static vs. dynamic time series model Suprious regression Stationary and nonstationary time series Unit

More information

Forecasting Based on Common Trends in Mixed Frequency Samples

Forecasting Based on Common Trends in Mixed Frequency Samples Forecasting Based on Common Trends in Mixed Frequency Samples PETER FULEKY and CARL S. BONHAM June 13, 2011 Abstract We extend the existing literature on small mixed frequency single factor models by allowing

More information

Econ 423 Lecture Notes: Additional Topics in Time Series 1

Econ 423 Lecture Notes: Additional Topics in Time Series 1 Econ 423 Lecture Notes: Additional Topics in Time Series 1 John C. Chao April 25, 2017 1 These notes are based in large part on Chapter 16 of Stock and Watson (2011). They are for instructional purposes

More information

Prof. Dr. Roland Füss Lecture Series in Applied Econometrics Summer Term Introduction to Time Series Analysis

Prof. Dr. Roland Füss Lecture Series in Applied Econometrics Summer Term Introduction to Time Series Analysis Introduction to Time Series Analysis 1 Contents: I. Basics of Time Series Analysis... 4 I.1 Stationarity... 5 I.2 Autocorrelation Function... 9 I.3 Partial Autocorrelation Function (PACF)... 14 I.4 Transformation

More information

Econ 424 Time Series Concepts

Econ 424 Time Series Concepts Econ 424 Time Series Concepts Eric Zivot January 20 2015 Time Series Processes Stochastic (Random) Process { 1 2 +1 } = { } = sequence of random variables indexed by time Observed time series of length

More information

New Information Response Functions

New Information Response Functions New Information Response Functions Caroline JARDET (1) Banque de France Alain MONFORT (2) CNAM, CREST and Banque de France Fulvio PEGORARO (3) Banque de France and CREST First version : February, 2009.

More information

Estimating Economic Relationships under Measurement Error: An Application to the Productivity of US Manufacturing

Estimating Economic Relationships under Measurement Error: An Application to the Productivity of US Manufacturing Estimating Economic Relationships under Measurement Error: An Application to the Productivity of US Manufacturing T. H. Y.Tran, A. N. Rambaldi,A.Peyrache School of Economics, The University of Queensland,

More information

Multivariate GARCH models.

Multivariate GARCH models. Multivariate GARCH models. Financial market volatility moves together over time across assets and markets. Recognizing this commonality through a multivariate modeling framework leads to obvious gains

More information

A Primer on Vector Autoregressions

A Primer on Vector Autoregressions A Primer on Vector Autoregressions Ambrogio Cesa-Bianchi VAR models 1 [DISCLAIMER] These notes are meant to provide intuition on the basic mechanisms of VARs As such, most of the material covered here

More information

Introduction to Macroeconomics

Introduction to Macroeconomics Introduction to Macroeconomics Martin Ellison Nuffi eld College Michaelmas Term 2018 Martin Ellison (Nuffi eld) Introduction Michaelmas Term 2018 1 / 39 Macroeconomics is Dynamic Decisions are taken over

More information

Covariance Stationary Time Series. Example: Independent White Noise (IWN(0,σ 2 )) Y t = ε t, ε t iid N(0,σ 2 )

Covariance Stationary Time Series. Example: Independent White Noise (IWN(0,σ 2 )) Y t = ε t, ε t iid N(0,σ 2 ) Covariance Stationary Time Series Stochastic Process: sequence of rv s ordered by time {Y t } {...,Y 1,Y 0,Y 1,...} Defn: {Y t } is covariance stationary if E[Y t ]μ for all t cov(y t,y t j )E[(Y t μ)(y

More information

Nowcasting the Finnish economy with a large Bayesian vector autoregressive model

Nowcasting the Finnish economy with a large Bayesian vector autoregressive model Nowcasting the Finnish economy with a large Bayesian vector autoregressive model Itkonen,J. & Juvonen,P. Suomen Pankki Conference on Real-Time Data Analysis, Methods and Applications 19.10.2017 Introduction

More information

Basic concepts and terminology: AR, MA and ARMA processes

Basic concepts and terminology: AR, MA and ARMA processes ECON 5101 ADVANCED ECONOMETRICS TIME SERIES Lecture note no. 1 (EB) Erik Biørn, Department of Economics Version of February 1, 2011 Basic concepts and terminology: AR, MA and ARMA processes This lecture

More information

Discussion of Bootstrap prediction intervals for linear, nonlinear, and nonparametric autoregressions, by Li Pan and Dimitris Politis

Discussion of Bootstrap prediction intervals for linear, nonlinear, and nonparametric autoregressions, by Li Pan and Dimitris Politis Discussion of Bootstrap prediction intervals for linear, nonlinear, and nonparametric autoregressions, by Li Pan and Dimitris Politis Sílvia Gonçalves and Benoit Perron Département de sciences économiques,

More information