Time Series Models of Heteroskedasticity

Size: px
Start display at page:

Download "Time Series Models of Heteroskedasticity"

Transcription

1 Chapter 21 Time Series Models of Heteroskedasticity There are no worked examples in the text, so we will work with the Federal Funds rate as shown on page 658 and below in Figure It will turn out that this is not an ideal example for demonstrating GARCH models 1, but it will be a good example of reading the diagnostics Figure 21.1: U.S. Federal funds rate Choosing the Mean Model The assumptions for the ARCH model in Hamilton are: (a) y t = x t β +u t (b) u t = h t v t (c) {v t }i.i.d.,ev t = 0,Ev 2 t = σ 2 (d) h t = ζ +α 1 u 2 t α m u 2 t m The first thing to note is that, because of (b) and (c), the ARCH process is defined as a white-noise process. Thus we need a model of the series which generates residuals that are serially uncorrelated in their mean. In most ARCH and GARCH models, there are separate mean and variance models. One problem with choosing a model for the mean is that most relatively simple methods for 1 A simple ARCH or GARCH doesn t fit it very well. 61

2 Time Series Models of Heteroskedasticity 62 choosing a model for the serial correlation of a series assume that the residuals are homoscedastic. However, if we re expecting ARCH or GARCH residuals, that won t be the case. Despite that, the mean model is generally chosen using standard methods we then test the residuals to see if any adjustments need to be made once we ve estimated a complete model. Just a quick look at the graph shows that the funds rate is strongly serially correlated. We will choose an autoregressive model for the mean using procedure, allowing for a maximum of 12 lags. The selection of the mean model and tests for ARCH effects is in Example cal(m) 1955 open data fedfund.rat data(format=rats) 1955:1 2000:12 graph(footer=$ "Figure 21.1 U.S. federal funds rate (monthly averages)") # ffed The chosen number of lags using BIC is 3 (Table 21.1). Different criteria give different results here, as both Hannan-Quinn (CRIT=HQ) and Akaike (CRIT=AIC) choose 12. For various reasons, though, it probably makes sense to start with a smaller model and expand it if that seems to be needed. Remember, again, that all of these are derived under the assumption of homoscedasticity. When there may be (and, in this case are) some overly large residuals, it s much easier to get (apparently) large autocorrelations by chance. Table 21.1: Bayesian IC Lag Analysis of AR Models Lags IC Based upon this, we will use an AR(3) model for the mean throughout. The first step is to estimate the base mean model: linreg ffed

3 Time Series Models of Heteroskedasticity 63 If we do a standard Ljung-Box Q test on the residuals from this, we would (strongly) reject that they are white from AR(3)") produces Figure However, despite the strong rejection of white noise, it doesn t suggest any obvious changes to the model to fix this. The large autocorrelations at 7, 8 and 9 would not easily be corrected by any simple adjustment AIC= SBC= Q= P-value Residuals from AR(3) Figure 21.2: Residual Analysis from AR(3) mean model However, the standard Q that is used is again based upon the assumption that the process is homoscedastic. A more general test is provided by West and Cho (1995), which is implemented in the RATS The West-Cho test with the same number of correlations yields quite a different result %resids produces Series %RESIDS Q(36) Signif which is near the middle of the distribution rather than being far out in the tail. Thus, we are led to conclude that the apparent significant correlations in the residuals from the basic model appear to be artifacts of the heteroscedastic process. Testing for ARCH Effects There are two principal methods to test for ARCH effects in the residuals for a regression (or ARMA model). The first is the LM test from Engle (1982), which

4 Time Series Models of Heteroskedasticity 64 takes the squared residuals and regresses on a constant and lagged squared residuals. This is discussed in the text on pp The test is similar to a Breusch-Godfrey test for serial correlation applied to the squares instead of the residuals themselves, but with one critical difference: in the BG test, you include the original regressors as well as the lagged residuals. In the ARCH test, you can ignore the fact that the residuals came from a regression because there is a standard result that, in the case of a regression with heteroscedastic errors, the parameter estimates for the regression itself and for the scedastic function are asymptotically uncorrelated (assuming no direct connection like a shared parameter). The other test is called McLeod-Li from McLeod and Li (1983): it s just a Ljung-Box Q test applied to the squared residuals. The first type of test can be implemented fairly easily using alinreg instruction, though there is also an@archtest procedure, which we will use as well. You need to square the residuals from the AR(3) model (after we copy them to the separate series U for use later), and regress the square on the CONSTANT and a chosen number of lags (here 4) of the square. We re also including here a test just of the last two lags. set u = %resids set u2 = uˆ2 linreg u2 # constant u2{1 to 4} exclude(title="arch Test: F Variant") # u2{1 to 4} exclude # u2{3 4} cdf(title="arch Test: Chi-Squared Variant") chisqr %trsquared 4 There are several ways to convert the information from this auxiliary regression into a test statistic. This shows the F-test variant, which just tests the lagged squares using a standard F-test. Note that we don t even have to do the separate EXCLUDE instruction, since it is just reproducing the Regression F in the standard LINREG output. There s also a chi-squared variant which uses TR 2 this has asymptotically a χ 2 with degrees of freedom equal to the number of tested lags. 2 The two should give very similar significance levels, particularly with the high number of degrees in this case (540). The coefficients on the regression are typically not of independent interest we just need the overall significance of the statistic. However, here the test on the final two lags suggests that for an ARCH model, two lags will be adequate: 2 In RATS variables, TR 2 is%trsquared.

5 Time Series Models of Heteroskedasticity 65 ARCH Test-F Variant Null Hypothesis : The Following Coefficients Are Zero U2 Lag(s) 1 to 4 F(4,540)= with Significance Level Null Hypothesis : The Following Coefficients Are Zero U2 Lag(s) 3 to 4 F(2,540)= with Significance Level procedure can also be used to do the LM test. This does the test for up to 4 lags, showing the results for every number of lags from 1 to 4. 3 You pass the residuals themselves (or whatever series you want to test) to the procedure, not the handles the squaring of the series u produces Test for ARCH in U Using data from 1955:04 to 2000:12 Lags Statistic Signif. Level The lags=4 value matches what we had above. Given the results on the separate exclusion on lags 3 and 4, it s not a surprise that the test statistic (while still very significant) is not as large for 4 lags as for 2. As with any test like this, the power is reduced if you put in more lags than actually needed. The advantage of doing@archtest with thespan option is that you can see whether the effect is there at the short lags even if it has been diluted in the longer lags. The McLeod-Li test is done using the procedure@mcleodli. As with@archtest, this takes the residuals rather than their squares as the u This strongly agrees with the conclusion from above the squared residuals are clearly not serially independent: McLeod-Li Test for Series U Using 549 Observations from 1955:04 to 2000:12 McLeod-Li(36-0) Though not typically necessary, you can also applied to the squared residuals to get a graphical look at the correlations of the squares. The following title="correlations of Squared Residuals") u2 3 TheSPAN indicates the distance between lag lengths used. SoLAGS=24,SPAN=4 will do 4, 8, 12,..., 24.

6 Time Series Models of Heteroskedasticity Figure 21.3: Correlations of Squared Residuals Maximum Likelihood Estimation with Gaussian v t The estimation of the ARCH model is in Example The estimation of an ARCH(m) model is very similar to what is described on pp except that RATS doesn t (by default) condition on the first m data points. 4 Instead, RATS uses where h t = ζ +α 1 u 2 t α m u 2 t m (21.1) u 2 s = { (ys x s β) 2 if s 1 ˆσ 2 ifs 0 (21.2) ˆσ 2 is a sample estimate of the variance of the residuals. Thus pre-sample squared residuals are replaced by a sample estimate of their mean. In this notation t = 1 is the first data point for which y t x t β is computable. With x requiring three lags, that will actually be entry 4 in the model in use. The difference between the two estimates is likely to be slight. Unlike the case of an ARMA model, there is no unconditional density for the pre-sample of an ARCH process. Different software will handle the pre-sample differently and so will give somewhat different results. Based upon the results of the test for ARCH, we will use 2 lags in the variance process. The RATS instruction for estimating the model is garch(q=2,regressors) / ffed The Q=2 selects an ARCH(2) model. The REGRESSORS option is used to indicate that there is a regression model for the mean the default is to just use 4 There is a CONDITION option which allows you to compute the likelihood for an ARCH conditioning on the early observations. Here you would use CONDITION=2 to get the likelihood as described in Hamilton.

7 Time Series Models of Heteroskedasticity 67 a simple process mean, the equivalent of using just the CONSTANT. As with a LINREG, the explanatory variables follow on a supplementary card using regression format. You ll note that the sample range (/ to mean the default) comes before the name of the dependent variable. This is because the GARCH instruction can be used for both univariate and multivariate models, so the list of dependent variables needs to be open-ended. The output is in Table By constrast, the OLS results for the mean model are in Table Table 21.2: OLS Estimates of Mean Model Linear Regression - Estimation by Least Squares Dependent Variable FFED Monthly Data From 1955:04 To 2000:12 Usable Observations 549 Degrees of Freedom 545 Centered Rˆ R-Barˆ Uncentered Rˆ Mean of Dependent Variable Std Error of Dependent Variable Standard Error of Estimate Sum of Squared Residuals Regression F(3,545) Significance Level of F Log Likelihood Durbin-Watson Statistic Variable Coeff Std Error T-Stat Signif 1. Constant FFED{1} FFED{2} FFED{3} One thing you will note right away is that there are many fewer summary statistics in the output for the ARCH model. There are a number of reasons for that, the most important of which is that almost all the summary statistics for least squares are interesting only if you are minimizing the sum of squared residuals, which ARCH most definitely is not. 5 The one summary statistic that they have in common is the log likelihood, which is comparable here since the two are estimated over the same sample range. 6 And the log likelihood for the ARCH estimates is much higher ( vs ). In the GARCH output, the mean model parameters are listed first, followed by the variance parameters. The C in the output is the constant in the variance model (ζ in Hamilton s notation) and the A(1) and A(2) are the coefficients 5 R 2 is based upon a ratio of sums of squares, the standard errors are estimates of a single variance using sums of squares, etc. 6 This is possible because of how RATS handles the pre-sample squared residuals. If the likelihood were were conditional on the lagged residuals, the ARCH estimates would have two fewer observations.

8 Time Series Models of Heteroskedasticity 68 Table 21.3: ARCH(2) with Gaussian Errors GARCH Model - Estimation by BFGS Convergence in 54 Iterations. Final criterion was <= Dependent Variable FFED Monthly Data From 1955:04 To 2000:12 Usable Observations 549 Log Likelihood Variable Coeff Std Error T-Stat Signif 1. Constant FFED{1} FFED{2} FFED{3} C A{1} A{2} on the lagged variances (α 1 and α 2 ). There is one obvious problem with this: α 1 + α 2 is bigger than one much bigger than one. The process has no unconditional variance, and out-of-sample predictions of the variance will rather rapidly increase without limit. 7 If the sum of the two coefficients were only slightly above 1 (such as 1.02), it wouldn t be a serious problem if we did a variance forecast for 1000 data points, the fact that the process was mildly explosive would become obvious, but forecasting 1000 data points given an actual data set with only around 500 is a bad idea. Thus the model we ve just estimated would have to be rejected as a poor description of the data. We will do some standard diagnostics to see if we can figure out how to adjust it. Diagnostics for univariate ARCH models TheGARCH instruction defines the series%resids, which are the y t x t β. We can graph those with graph(footer="arch(2) Residuals") # %resids to produce Figure These are only very slightly different from the least squares residuals, and aren t directly very useful for diagnostics for the same reasons the least squares residuals weren t the heteroscedasticity invalidates most diagnostic procedures. Instead, diagnostics for ARCH and GARCH models are generally based upon standardized residuals. The ARCH model provides an estimate of the timevarying variance (h t ) of the residual process. Dividing the model residuals by ht gives a set of residuals which should be: 7 Despite the explosive coefficients, the estimated ARCH process is stationary with infinite variance. This is a peculiarity of ARCH and GARCH models.

9 Time Series Models of Heteroskedasticity Figure 21.4: Residuals from ARCH(2) 1. Serially uncorrelated if our mean model is correct 2. Homoscedastic (actually variance 1.0) if our variance model is correct You can save the h t series on thegarch instruction using thehseries option. In practice, you would just include that right off, but for illustration we left it off the original estimation. However, now we need it, so we change the instruction to: garch(q=2,regressors,hseries=h) / ffed We can compute and graph the standardized residuals with set ustd = %resids/sqrt(h) graph(footer="arch(2) Standardized Residuals") # ustd which produces Figure The first indication of a problem with these is the value close to 6.0 in early If the residual process were Gaussian (which is what is assumed with the options used ongarch), the probability of a value that large is less than one in a million. There are also quite a few others that are 3 or larger in absolute value, which have probablities of roughly.001. So the data are much fatter-tailed than the assumption of Gaussianity would suggest. Three diagnostics to apply to the standardized residuals are: 1. Test for Gaussianity (normality) 2. Test for serial correlation 3. Test for remaining ARCH effects Passing a test for normality isn t strictly required the estimates are still consistent even under broader assumptions as discussed on page 663. However,

10 Time Series Models of Heteroskedasticity Figure 21.5: Standardized Residuals from ARCH(2) rejections in the other two will show some inadequacy in the model. The most commonly used test for normality is Jarque-Bera, which is included in the output from the standard STATISTICS instruction. We can do both the tests for serial correlation and for remaining ARCH using the@regcorrs procedure, one applied to the standardized residuals, one to the squared standardized residuals: stats title="standardized Residuals") ustd disp "Q for Residual Serial Correlation" %qstat $ "significance level" %qsignif set ustd2 = title="standardized Squared Residuals") ustd2 disp "McLeod-Li for Residual ARCH=" %qstat $ "significance level" %qsignif The degrees of freedom corrections are 3 for the test for serial correlation (because of the 3 AR lags) and 2 for the test for residual ARCH (because of the 2 ARCH lags). All three tests are overwhelmingly rejected. The normality test isn t a surprise given the very large standardized residuals. The pattern on the serial correlation is, however, unexpected given the results of the West-Cho test on the least squares residuals, with Figure 21.6 showing a long string of individually significant coefficients starting at lag 1. The difference, however, is that the West-Cho test uses a separate adjustment for heteroscedasticity each lag in the autocorrelation, and the standardized residuals are adjusted using the specific ARCH model.

11 Time Series Models of Heteroskedasticity 71 Statistics on Series USTD Monthly Data From 1955:04 To 2000:12 Observations 549 Sample Mean Variance Standard Error SE of Sample Mean t-statistic (Mean=0) Signif Level (Mean=0) Skewness Signif Level (Sk=0) Kurtosis (excess) Signif Level (Ku=0) Jarque-Bera Signif Level (JB=0) Q for Residual Serial Correlation significance level e-011 McLeod-Li for Residual ARCH= significance level e Q= P-value Figure 21.6: Residual Correlations of Standardized Residuals from ARCH(2) If we hadn t already rejected the model based upon the explosive ARCH process, we would reject it now for the failure of the diagnostics. Both the graph of the standardized residuals and the results from the Jarque-Bera test suggest that the assumption of an ARCH model with Gaussian residuals is untenable. We thus try a different conditional density. Maximum Likelihood Estimation with Non-Gaussian v t The GARCH instruction offers two alternatives to the Normal for the conditional density of the residuals: the Student-t and the generalized error distribution (GED). The t has strictly fatter tails than the Normal, which is the limit distribution as the degrees of freedom ν. The GED family includes both fatterand thinner-tailed densities. Of the two, the t is much more commonly used. However, you have to be a bit careful in using these, as the formula (21.1) generates the variance of the residuals. The variance of a standardtwithν degrees of freedom is ν/(ν 2), so the t density has to have its scale reparameterized to give the required variance. Because the variance of a t doesn t exist when ν 2, 2 is the lower limit on the degrees of freedom the rescaled likelihood is undefined below that. The model is estimated by adding thedistrib=t option to thegarch instruction. We will also save the variances into a different series than before this one calledht. The results are in Table 21.4

12 Time Series Models of Heteroskedasticity 72 garch(p=0,q=2,regressors,distrib=t,hseries=ht) / ffed Table 21.4: ARCH(2) with Student-t Errors GARCH Model - Estimation by BFGS Convergence in 58 Iterations. Final criterion was <= Dependent Variable FFED Monthly Data From 1955:04 To 2000:12 Usable Observations 549 Log Likelihood Variable Coeff Std Error T-Stat Signif 1. Constant FFED{1} FFED{2} FFED{3} C A{1} A{2} Shape The new model gives a dramatic improvement to the likelihood over the ARCH(2) with Gaussian errors, now versus before. However, the ARCH process is even more unstable than before. Rather than worry too much about this, we will move on to the (much) more commonly used GARCH processes, in hopes that a GARCH will work better. GARCH Models The ARCH(m) process is different in behavior from the (apparently) similar MA(q) process. In the MA(q), correlation is zero for data separated by more than q periods. One might think that the volatility relationship in the ARCH(m) would similarly cut off after m periods. However, that s not the case. The difference is that the building block of the ARCH is u 2 t, which has a non-zero expected value, unlike the zero meanu t used in the MA. Instead, we can rewrite the ARCH process in terms of the zero-mean building blocks u 2 t h t. If we look at the ARCH(2) process, we can rearrange this to h t = Eu 2 t = ζ +α 1 (u 2 t 1 h t 1 )+α 2 (u 2 t 2 h t 2 )+α 1 h t 1 +α 2 h t 2 (21.3) Assuming the α are positive (the model makes little sense if they aren t), then shocks which increase the variance going forward are ones where u 2 s h s > 0, that is, a residual is bigger than one standard deviation according to the ARCH recursion. The problem, in practice, with the low order ARCH model is that the variance processes often seem to be fairly persistent. Now, (21.3) can show a high degree of persistence if α 1 and α 2 are non-negative and sum to a number near (but

13 Time Series Models of Heteroskedasticity 73 less than) one, due to the behavior of the second-order difference equation in h. The problem is that those same fairly large α coefficients also show up in the transient terms u 2 s h s. As a result, the lower order ARCH seems to require overstating the immediate impact of a shock in order to get the persistence correct. Bringing the impact down requires a longer ARCH process, but that runs into the problem faced by Engle in his original paper even an ARCH(4) process is likely to have negative lag coefficients if run unconstrained, since they are squeezed by the need to sum to less than one to keep the process stable. 8 The GARCH (Generalized ARCH) process of Bollerslev (1986) corrects the problem by directly including a persistence term for the variance. This very quickly supplanted the ARCH model to the extent that ARCH models themselves are rarely used except in specialized situations (like switching models) where the GARCH recursion is hard to handle. While it s possible to have higher orders, the vast majority of empirical work with GARCH uses a 1,1 model, which means one ARCH term on the lagged squared residual and one term on the lagged variance: h t = ζ +α 1 u 2 t 1 +β 1 h t 1 (21.4) If we use the same technique of replacing u 2 t 1 with itself minus h t 1, we get h t = ζ +α 1 (u 2 t 1 h t 1 )+(α 1 +β 1 )h t 1 (21.5) Now, for stability of the variance we need (α 1 +β 1 ) < 1, but with the GARCH the value of that is largely decoupled from the coefficient on (u 2 t 1 h t 1 ) we can have a persistent variance process with a large β 1 and small α 1. The one technical issue with fitting GARCH models is that, while the ARCH variance formula (21.1) can be computed exactly given the data andβ, the variance in (21.4) depends upon an unobservable presample value for h. Different ways of handling this give different likelihoods and thus different estimators. The RATS GARCH instruction uses for pre-sample h the same ˆσ 2 value used for presample u 2 s in (21.2). Thus h 1 = ζ + (α 1 +β 1 )ˆσ 2, with all later values being computed using (21.4). If β 1 is close to one, the results can be sensitive to the handling of the presample, 9 so if you have some concern, you can experiment with other values using the option PRESAMPLE, which feeds in a value to use for ˆσ 2. 8 Again, a decided difference between ARCH and ARMA processes: there is nothing wrong with negative coefficients in ARMA models because they apply to data which can take either sign, while in the ARCH the recursions apply to positive data and have to produce positive values. 9 If we do two parallel recursions onh t and h t which differ only in the pre-sample value, then h t = ζ +α 1 u 2 t 1 +β 1 h t 1 and h t = ζ +α 1 u 2 t 1 +β 1 ht 1. Since the first two terms are common to the expressions, h t h t = β 1 (h t 1 h t 1 ) so the difference declines geometrically at the rate β 1.

14 Time Series Models of Heteroskedasticity 74 Estimation of GARCH models is in Example You estimate a GARCH(1,1) model with the GARCH instruction with options P=1 (number of lagged variance parameters) and Q=1 (number of lagged squared residuals), along with other options as needed. In our case: garch(p=1,q=1,regressors,hseries=h) / ffed which produces Table The log likelihood is much better than the corresponding ARCH(2) model (Table 21.3). The model is still unstable (α 1 + β ), though that s much better than we saw with the ARCH model. Table 21.5: GARCH(1,1) with Gaussian Errors GARCH Model - Estimation by BFGS Convergence in 62 Iterations. Final criterion was <= Dependent Variable FFED Monthly Data From 1955:04 To 2000:12 Usable Observations 549 Log Likelihood Variable Coeff Std Error T-Stat Signif 1. Constant FFED{1} FFED{2} FFED{3} C A B The standardized residuals (Figure 21.7) aren t quite as extreme as for the ARCH, but are still far too fat-tailed to be conditionally Normal. So again, we re-estimate with t errors, with results in Table Figure 21.7: Standardized Residuals from GARCH(1,1) The standard diagnostics for the GARCH with t distributed errors are

15 Time Series Models of Heteroskedasticity 75 Table 21.6: GARCH(1,1) with t errors GARCH Model - Estimation by BFGS Convergence in 84 Iterations. Final criterion was <= Dependent Variable FFED Monthly Data From 1955:04 To 2000:12 Usable Observations 549 Log Likelihood Variable Coeff Std Error T-Stat Signif 1. Constant FFED{1} FFED{2} FFED{3} C A B Shape Statistics on Series USTD Monthly Data From 1955:04 To 2000:12 Observations 549 Sample Mean Variance Standard Error SE of Sample Mean t-statistic (Mean=0) Signif Level (Mean=0) Skewness Signif Level (Sk=0) Kurtosis (excess) Signif Level (Ku=0) Jarque-Bera Signif Level (JB=0) Q for Residual Serial Correlation significance level McLeod-Li for Residual ARCH= significance level As with the ARCH model, shifting to the t produces an even more unstable model than is estimated with the Gaussian errors. We can look at the estimates of the volatility using set stddev = sqrt(h) graph(footer="garch(1,1) Standard Deviation Estimate") # stddev This graphs the standard deviations rather than variances (Figure 21.8). A graph of the variance itself would show as effectively zero relative to the spike in the early 1980 s. The blip at the beginning is an artifact of using the overall sample variance for the pre-sample value obviously, the full-sample value isn t representative of the early part of the sample. It s clear from looking at this that there is only one really major clustering of large residuals, in the period , which is while the Federal Reserve was switching policy targets to combat inflation. We can try to fix our GARCH model (which so far hasn t produced a satisfactory model) by including a variance shift dummy for this period. This is done using thexregressors option, which puts regressors into the variance equation. If, as here, you need both mean regressors and variance regressors, you list the mean regressors on the first supplementary line.

16 Time Series Models of Heteroskedasticity Figure 21.8: Standard Deviations from GARCH(1,1) set policy = t>=1980:1.and.t<=1982:12 garch(p=1,q=1,regressors,xregressors,dist=t,hseries=h) / ffed # policy The results are in Table The shift dummy is quite large (.6367 versus the standard variance intercept of just.0107) but statistically insignificant the log likelihood really isn t that much better. This might seem surprising except that the whole point of the GARCH model is to explain just these sorts of clusters without the dummy the first one or two large residuals might be a surprise but the next three years aren t. It s possible for the type of data that we see here to be generated by a stationary GARCH process with (slightly) explosive roots. Nelson (1990) showed that you can have a stationary GARCH process with infinite variance if (α 1 + β 1 ) > 1, particularly if β 1 is well less than one. The intuition behind this is that the mode of the residual process remains zero even if the variance is large. If much of the persistence comes from the u 2 t 1 term, the process can rather quickly reset itself if you just get a few shocks in a row near zero. If you simulate one of these types of explosive-yet-stationary processes, you will see very occasional clusters of huge variances surrounded by long periods of (relative) calm. On the other hand, it s possible that this interest rates series is governed by a change in regime, and an attempt to model it with a single GARCH across the whole sample is unrealistic. For instance, set test = test garch(p=1,q=1) / test will generate a series which seems to have ARCH even though it simply has two variance regimes.

17 Time Series Models of Heteroskedasticity 77 Table 21.7: GARCH(1,1) with Variance Shift Dummy GARCH Model - Estimation by BFGS Convergence in 91 Iterations. Final criterion was <= Dependent Variable FFED Monthly Data From 1955:04 To 2000:12 Usable Observations 549 Log Likelihood Variable Coeff Std Error T-Stat Signif 1. Constant FFED{1} FFED{2} FFED{3} C A B POLICY Shape GARCH models are much more frequently applied to financial returns data than to macroeconomic data, and are usually done with data observed with greater frequency (weekly, daily or even finer). One problem with a monthly macro series like the interest rates is that the data are almost always averaged across the period, which leads to problems with the timing of events. 10 A spike in interest rates coming near the end of the month will barely affect the reporting period in which it actually occurred since the average will be dominated by the lower values early in the month. Thus, the data you have will show the surprise one month later, which could upset the timing of the GARCH model. 10 Monthly interest rate series in macroeconomic databases are almost always reported as monthly averages of daily values.

18 Time Series Models of Heteroskedasticity 78 Example 21.1 ARCH Model: Preliminaries This selects the mean model and tests for ARCH effects in the residuals. cal(m) 1955 open data fedfund.rat data(format=rats) 1955:1 2000:12 graph(footer=$ "Figure 21.1 U.S. federal funds rate (monthly averages)") # ffed Choose lag ffed The "mean model" used throughout this is a third order AR with an intercept. linreg ffed Test for residual serial correlation with a standard Q and a Q adjusted for possible from %resids Check for ARCH effects in the residuals by regressing the squared residuals on their lags. This is described on page 664. The exclusion tests would seem to indicate that ARCH(2) is appropriate. set u = %resids set u2 = uˆ2 linreg u2 # constant u2{1 to 4} exclude(title="arch Test: F Variant") # u2{1 to 4} exclude # u2{3 4} cdf(title="arch Test: Chi-Squared Variant") chisqr %trsquared 4 Using the ARCH test procedure to do tests for all lags from 1 to u McLeod-Li title="correlations of Squared Residuals") u2

19 Time Series Models of Heteroskedasticity 79 Example 21.2 ARCH Model: Estimation This estimates an ARCH model and does diagnostics on the results. cal(m) 1955 open data fedfund.rat data(format=rats) 1955:1 2000:12 ARCH(2) with Gaussian errors garch(p=0,q=2,regressors,hseries=h) / ffed graph(footer="arch(2) Residuals") # %resids set ustd = %resids/sqrt(h) graph(footer="arch(2) Standardized Residuals") # ustd Diagnostics stats title="standardized Residuals") ustd disp "Q for Residual Serial Correlation" %qstat $ "significance level" %qsignif set ustd2 = title="standardized Squared Residuals") ustd2 disp "McLeod-Li for Residual ARCH=" %qstat $ "significance level" %qsignif ARCH(2) with t-distributed errors garch(p=0,q=2,regressors,distrib=t,hseries=ht) / ffed ARCH(2) using QMLE methods. This uses the Gaussian errors but corrects the covariance matrix for misspecification. garch(p=0,q=2,regressors,robusterrors) / ffed Example 21.3 GARCH Model: Estimation This estimates an GARCH model and does diagnostics on the results. cal(m) 1955 open data fedfund.rat data(format=rats) 1955:1 2000:12

20 Time Series Models of Heteroskedasticity 80 GARCH(1,1) garch(p=1,q=1,regressors,hseries=h) / ffed set ustd = %resids/sqrt(h) graph(footer="garch(1,1) Standardized Residuals") # ustd Diagnostics stats title="standardized Residuals") ustd disp "Q for Residual Serial Correlation" %qstat $ "significance level" %qsignif set ustd2 = title="standardized Squared Residuals") ustd2 disp "McLeod-Li for Residual ARCH=" %qstat $ "significance level" %qsignif GARCH(1,1) with t errors garch(p=1,q=1,regressors,dist=t,hseries=h) / ffed Diagnostics set ustd = %resids/sqrt(h) stats title="standardized Residuals") ustd disp "Q for Residual Serial Correlation" %qstat $ "significance level" %qsignif set ustd2 = title="standardized Squared Residuals") ustd2 disp "McLeod-Li for Residual ARCH=" %qstat $ "significance level" %qsignif set stddev = sqrt(h) graph(footer="garch(1,1) Standard Deviation Estimate") # stddev Add variance shift dummy set policy = t>=1980:1.and.t<=1982:12 garch(p=1,q=1,regressors,xregressors,dist=t,hseries=h) / ffed # policy

Volatility. Gerald P. Dwyer. February Clemson University

Volatility. Gerald P. Dwyer. February Clemson University Volatility Gerald P. Dwyer Clemson University February 2016 Outline 1 Volatility Characteristics of Time Series Heteroskedasticity Simpler Estimation Strategies Exponentially Weighted Moving Average Use

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

LECTURE 10: MORE ON RANDOM PROCESSES

LECTURE 10: MORE ON RANDOM PROCESSES LECTURE 10: MORE ON RANDOM PROCESSES AND SERIAL CORRELATION 2 Classification of random processes (cont d) stationary vs. non-stationary processes stationary = distribution does not change over time more

More information

THE UNIVERSITY OF CHICAGO Graduate School of Business Business 41202, Spring Quarter 2003, Mr. Ruey S. Tsay

THE UNIVERSITY OF CHICAGO Graduate School of Business Business 41202, Spring Quarter 2003, Mr. Ruey S. Tsay THE UNIVERSITY OF CHICAGO Graduate School of Business Business 41202, Spring Quarter 2003, Mr. Ruey S. Tsay Solutions to Homework Assignment #4 May 9, 2003 Each HW problem is 10 points throughout this

More information

Econ 427, Spring Problem Set 3 suggested answers (with minor corrections) Ch 6. Problems and Complements:

Econ 427, Spring Problem Set 3 suggested answers (with minor corrections) Ch 6. Problems and Complements: Econ 427, Spring 2010 Problem Set 3 suggested answers (with minor corrections) Ch 6. Problems and Complements: 1. (page 132) In each case, the idea is to write these out in general form (without the lag

More information

LATVIAN GDP: TIME SERIES FORECASTING USING VECTOR AUTO REGRESSION

LATVIAN GDP: TIME SERIES FORECASTING USING VECTOR AUTO REGRESSION LATVIAN GDP: TIME SERIES FORECASTING USING VECTOR AUTO REGRESSION BEZRUCKO Aleksandrs, (LV) Abstract: The target goal of this work is to develop a methodology of forecasting Latvian GDP using ARMA (AutoRegressive-Moving-Average)

More information

The GARCH Analysis of YU EBAO Annual Yields Weiwei Guo1,a

The GARCH Analysis of YU EBAO Annual Yields Weiwei Guo1,a 2nd Workshop on Advanced Research and Technology in Industry Applications (WARTIA 2016) The GARCH Analysis of YU EBAO Annual Yields Weiwei Guo1,a 1 Longdong University,Qingyang,Gansu province,745000 a

More information

Autoregressive Moving Average (ARMA) Models and their Practical Applications

Autoregressive Moving Average (ARMA) Models and their Practical Applications Autoregressive Moving Average (ARMA) Models and their Practical Applications Massimo Guidolin February 2018 1 Essential Concepts in Time Series Analysis 1.1 Time Series and Their Properties Time series:

More information

Arma-Arch Modeling Of The Returns Of First Bank Of Nigeria

Arma-Arch Modeling Of The Returns Of First Bank Of Nigeria Arma-Arch Modeling Of The Returns Of First Bank Of Nigeria Emmanuel Alphonsus Akpan Imoh Udo Moffat Department of Mathematics and Statistics University of Uyo, Nigeria Ntiedo Bassey Ekpo Department of

More information

Diagnostic Test for GARCH Models Based on Absolute Residual Autocorrelations

Diagnostic Test for GARCH Models Based on Absolute Residual Autocorrelations Diagnostic Test for GARCH Models Based on Absolute Residual Autocorrelations Farhat Iqbal Department of Statistics, University of Balochistan Quetta-Pakistan farhatiqb@gmail.com Abstract In this paper

More information

AGEC 621 Lecture 16 David Bessler

AGEC 621 Lecture 16 David Bessler AGEC 621 Lecture 16 David Bessler This is a RATS output for the dummy variable problem given in GHJ page 422; the beer expenditure lecture (last time). I do not expect you to know RATS but this will give

More information

Univariate ARIMA Models

Univariate ARIMA Models Univariate ARIMA Models ARIMA Model Building Steps: Identification: Using graphs, statistics, ACFs and PACFs, transformations, etc. to achieve stationary and tentatively identify patterns and model components.

More information

Lecture 6a: Unit Root and ARIMA Models

Lecture 6a: Unit Root and ARIMA Models Lecture 6a: Unit Root and ARIMA Models 1 2 Big Picture A time series is non-stationary if it contains a unit root unit root nonstationary The reverse is not true. For example, y t = cos(t) + u t has no

More information

AUTOCORRELATION. Phung Thanh Binh

AUTOCORRELATION. Phung Thanh Binh AUTOCORRELATION Phung Thanh Binh OUTLINE Time series Gauss-Markov conditions The nature of autocorrelation Causes of autocorrelation Consequences of autocorrelation Detecting autocorrelation Remedial measures

More information

Economics 536 Lecture 7. Introduction to Specification Testing in Dynamic Econometric Models

Economics 536 Lecture 7. Introduction to Specification Testing in Dynamic Econometric Models University of Illinois Fall 2016 Department of Economics Roger Koenker Economics 536 Lecture 7 Introduction to Specification Testing in Dynamic Econometric Models In this lecture I want to briefly describe

More information

Heteroskedasticity in Time Series

Heteroskedasticity in Time Series Heteroskedasticity in Time Series Figure: Time Series of Daily NYSE Returns. 206 / 285 Key Fact 1: Stock Returns are Approximately Serially Uncorrelated Figure: Correlogram of Daily Stock Market Returns.

More information

CHAPTER 6: SPECIFICATION VARIABLES

CHAPTER 6: SPECIFICATION VARIABLES Recall, we had the following six assumptions required for the Gauss-Markov Theorem: 1. The regression model is linear, correctly specified, and has an additive error term. 2. The error term has a zero

More information

Romanian Economic and Business Review Vol. 3, No. 3 THE EVOLUTION OF SNP PETROM STOCK LIST - STUDY THROUGH AUTOREGRESSIVE MODELS

Romanian Economic and Business Review Vol. 3, No. 3 THE EVOLUTION OF SNP PETROM STOCK LIST - STUDY THROUGH AUTOREGRESSIVE MODELS THE EVOLUTION OF SNP PETROM STOCK LIST - STUDY THROUGH AUTOREGRESSIVE MODELS Marian Zaharia, Ioana Zaheu, and Elena Roxana Stan Abstract Stock exchange market is one of the most dynamic and unpredictable

More information

at least 50 and preferably 100 observations should be available to build a proper model

at least 50 and preferably 100 observations should be available to build a proper model III Box-Jenkins Methods 1. Pros and Cons of ARIMA Forecasting a) need for data at least 50 and preferably 100 observations should be available to build a proper model used most frequently for hourly or

More information

Multiple Regression Analysis

Multiple Regression Analysis Multiple Regression Analysis y = 0 + 1 x 1 + x +... k x k + u 6. Heteroskedasticity What is Heteroskedasticity?! Recall the assumption of homoskedasticity implied that conditional on the explanatory variables,

More information

Univariate linear models

Univariate linear models Univariate linear models The specification process of an univariate ARIMA model is based on the theoretical properties of the different processes and it is also important the observation and interpretation

More information

Appendix 1 Model Selection: GARCH Models. Parameter estimates and summary statistics for models of the form: 1 if ɛt i < 0 0 otherwise

Appendix 1 Model Selection: GARCH Models. Parameter estimates and summary statistics for models of the form: 1 if ɛt i < 0 0 otherwise Appendix 1 Model Selection: GARCH Models Parameter estimates and summary statistics for models of the form: R t = µ + ɛ t ; ɛ t (0, h 2 t ) (1) h 2 t = α + 2 ( 2 ( 2 ( βi ht i) 2 + γi ɛt i) 2 + δi D t

More information

Iris Wang.

Iris Wang. Chapter 10: Multicollinearity Iris Wang iris.wang@kau.se Econometric problems Multicollinearity What does it mean? A high degree of correlation amongst the explanatory variables What are its consequences?

More information

GARCH Models Estimation and Inference

GARCH Models Estimation and Inference GARCH Models Estimation and Inference Eduardo Rossi University of Pavia December 013 Rossi GARCH Financial Econometrics - 013 1 / 1 Likelihood function The procedure most often used in estimating θ 0 in

More information

Trends and Unit Roots in Greek Real Money Supply, Real GDP and Nominal Interest Rate

Trends and Unit Roots in Greek Real Money Supply, Real GDP and Nominal Interest Rate European Research Studies Volume V, Issue (3-4), 00, pp. 5-43 Trends and Unit Roots in Greek Real Money Supply, Real GDP and Nominal Interest Rate Karpetis Christos & Varelas Erotokritos * Abstract This

More information

Chapter 12: An introduction to Time Series Analysis. Chapter 12: An introduction to Time Series Analysis

Chapter 12: An introduction to Time Series Analysis. Chapter 12: An introduction to Time Series Analysis Chapter 12: An introduction to Time Series Analysis Introduction In this chapter, we will discuss forecasting with single-series (univariate) Box-Jenkins models. The common name of the models is Auto-Regressive

More information

TIME SERIES ANALYSIS AND FORECASTING USING THE STATISTICAL MODEL ARIMA

TIME SERIES ANALYSIS AND FORECASTING USING THE STATISTICAL MODEL ARIMA CHAPTER 6 TIME SERIES ANALYSIS AND FORECASTING USING THE STATISTICAL MODEL ARIMA 6.1. Introduction A time series is a sequence of observations ordered in time. A basic assumption in the time series analysis

More information

13. Time Series Analysis: Asymptotics Weakly Dependent and Random Walk Process. Strict Exogeneity

13. Time Series Analysis: Asymptotics Weakly Dependent and Random Walk Process. Strict Exogeneity Outline: Further Issues in Using OLS with Time Series Data 13. Time Series Analysis: Asymptotics Weakly Dependent and Random Walk Process I. Stationary and Weakly Dependent Time Series III. Highly Persistent

More information

Topic 4 Unit Roots. Gerald P. Dwyer. February Clemson University

Topic 4 Unit Roots. Gerald P. Dwyer. February Clemson University Topic 4 Unit Roots Gerald P. Dwyer Clemson University February 2016 Outline 1 Unit Roots Introduction Trend and Difference Stationary Autocorrelations of Series That Have Deterministic or Stochastic Trends

More information

Econometrics. 9) Heteroscedasticity and autocorrelation

Econometrics. 9) Heteroscedasticity and autocorrelation 30C00200 Econometrics 9) Heteroscedasticity and autocorrelation Timo Kuosmanen Professor, Ph.D. http://nomepre.net/index.php/timokuosmanen Today s topics Heteroscedasticity Possible causes Testing for

More information

Lecture 6: Univariate Volatility Modelling: ARCH and GARCH Models

Lecture 6: Univariate Volatility Modelling: ARCH and GARCH Models Lecture 6: Univariate Volatility Modelling: ARCH and GARCH Models Prof. Massimo Guidolin 019 Financial Econometrics Winter/Spring 018 Overview ARCH models and their limitations Generalized ARCH models

More information

Autocorrelation. Think of autocorrelation as signifying a systematic relationship between the residuals measured at different points in time

Autocorrelation. Think of autocorrelation as signifying a systematic relationship between the residuals measured at different points in time Autocorrelation Given the model Y t = b 0 + b 1 X t + u t Think of autocorrelation as signifying a systematic relationship between the residuals measured at different points in time This could be caused

More information

CHAPTER 8 MODEL DIAGNOSTICS. 8.1 Residual Analysis

CHAPTER 8 MODEL DIAGNOSTICS. 8.1 Residual Analysis CHAPTER 8 MODEL DIAGNOSTICS We have now discussed methods for specifying models and for efficiently estimating the parameters in those models. Model diagnostics, or model criticism, is concerned with testing

More information

ECON3327: Financial Econometrics, Spring 2016

ECON3327: Financial Econometrics, Spring 2016 ECON3327: Financial Econometrics, Spring 2016 Wooldridge, Introductory Econometrics (5th ed, 2012) Chapter 11: OLS with time series data Stationary and weakly dependent time series The notion of a stationary

More information

Econometric Forecasting

Econometric Forecasting Robert M. Kunst robert.kunst@univie.ac.at University of Vienna and Institute for Advanced Studies Vienna October 1, 2014 Outline Introduction Model-free extrapolation Univariate time-series models Trend

More information

in the time series. The relation between y and x is contemporaneous.

in the time series. The relation between y and x is contemporaneous. 9 Regression with Time Series 9.1 Some Basic Concepts Static Models (1) y t = β 0 + β 1 x t + u t t = 1, 2,..., T, where T is the number of observation in the time series. The relation between y and x

More information

OLS Assumptions Violation and Its Treatment: An Empirical Test of Gross Domestic Product Relationship with Exchange Rate, Inflation and Interest Rate

OLS Assumptions Violation and Its Treatment: An Empirical Test of Gross Domestic Product Relationship with Exchange Rate, Inflation and Interest Rate J. Appl. Environ. Biol. Sci., 6(5S)43-54, 2016 2016, TextRoad Publication ISSN: 2090-4274 Journal of Applied Environmental and Biological Sciences www.textroad.com OLS Assumptions Violation and Its Treatment:

More information

1 Motivation for Instrumental Variable (IV) Regression

1 Motivation for Instrumental Variable (IV) Regression ECON 370: IV & 2SLS 1 Instrumental Variables Estimation and Two Stage Least Squares Econometric Methods, ECON 370 Let s get back to the thiking in terms of cross sectional (or pooled cross sectional) data

More information

Econometrics I: Univariate Time Series Econometrics (1)

Econometrics I: Univariate Time Series Econometrics (1) Econometrics I: Dipartimento di Economia Politica e Metodi Quantitativi University of Pavia Overview of the Lecture 1 st EViews Session VI: Some Theoretical Premises 2 Overview of the Lecture 1 st EViews

More information

End-Semester Examination MA 373 : Statistical Analysis on Financial Data

End-Semester Examination MA 373 : Statistical Analysis on Financial Data End-Semester Examination MA 373 : Statistical Analysis on Financial Data Instructor: Dr. Arabin Kumar Dey, Department of Mathematics, IIT Guwahati Note: Use the results in Section- III: Data Analysis using

More information

Lecture 2: Univariate Time Series

Lecture 2: Univariate Time Series Lecture 2: Univariate Time Series Analysis: Conditional and Unconditional Densities, Stationarity, ARMA Processes Prof. Massimo Guidolin 20192 Financial Econometrics Spring/Winter 2017 Overview Motivation:

More information

Economics 471: Econometrics Department of Economics, Finance and Legal Studies University of Alabama

Economics 471: Econometrics Department of Economics, Finance and Legal Studies University of Alabama Economics 471: Econometrics Department of Economics, Finance and Legal Studies University of Alabama Course Packet The purpose of this packet is to show you one particular dataset and how it is used in

More information

GARCH Models Estimation and Inference. Eduardo Rossi University of Pavia

GARCH Models Estimation and Inference. Eduardo Rossi University of Pavia GARCH Models Estimation and Inference Eduardo Rossi University of Pavia Likelihood function The procedure most often used in estimating θ 0 in ARCH models involves the maximization of a likelihood function

More information

Empirical Economic Research, Part II

Empirical Economic Research, Part II Based on the text book by Ramanathan: Introductory Econometrics Robert M. Kunst robert.kunst@univie.ac.at University of Vienna and Institute for Advanced Studies Vienna December 7, 2011 Outline Introduction

More information

EC4051 Project and Introductory Econometrics

EC4051 Project and Introductory Econometrics EC4051 Project and Introductory Econometrics Dudley Cooke Trinity College Dublin Dudley Cooke (Trinity College Dublin) Intro to Econometrics 1 / 23 Project Guidelines Each student is required to undertake

More information

1 Phelix spot and futures returns: descriptive statistics

1 Phelix spot and futures returns: descriptive statistics MULTIVARIATE VOLATILITY MODELING OF ELECTRICITY FUTURES: ONLINE APPENDIX Luc Bauwens 1, Christian Hafner 2, and Diane Pierret 3 October 13, 2011 1 Phelix spot and futures returns: descriptive statistics

More information

Final Exam Financial Data Analysis at the University of Freiburg (Winter Semester 2008/2009) Friday, November 14, 2008,

Final Exam Financial Data Analysis at the University of Freiburg (Winter Semester 2008/2009) Friday, November 14, 2008, Professor Dr. Roman Liesenfeld Final Exam Financial Data Analysis at the University of Freiburg (Winter Semester 2008/2009) Friday, November 14, 2008, 10.00 11.30am 1 Part 1 (38 Points) Consider the following

More information

Circle the single best answer for each multiple choice question. Your choice should be made clearly.

Circle the single best answer for each multiple choice question. Your choice should be made clearly. TEST #1 STA 4853 March 6, 2017 Name: Please read the following directions. DO NOT TURN THE PAGE UNTIL INSTRUCTED TO DO SO Directions This exam is closed book and closed notes. There are 32 multiple choice

More information

Inflation and inflation uncertainty in Finland

Inflation and inflation uncertainty in Finland Mat-2.4108 Independent Research Projects in Applied Mathematics Inflation and inflation uncertainty in Finland 1985 2008 Matti Ollila 13.4.2009 HELSINKI UNIVERSITY OF TECHNOLOGY Faculty of Information

More information

The Prediction of Monthly Inflation Rate in Romania 1

The Prediction of Monthly Inflation Rate in Romania 1 Economic Insights Trends and Challenges Vol.III (LXVI) No. 2/2014 75-84 The Prediction of Monthly Inflation Rate in Romania 1 Mihaela Simionescu Institute for Economic Forecasting of the Romanian Academy,

More information

Reading Assignment. Serial Correlation and Heteroskedasticity. Chapters 12 and 11. Kennedy: Chapter 8. AREC-ECON 535 Lec F1 1

Reading Assignment. Serial Correlation and Heteroskedasticity. Chapters 12 and 11. Kennedy: Chapter 8. AREC-ECON 535 Lec F1 1 Reading Assignment Serial Correlation and Heteroskedasticity Chapters 1 and 11. Kennedy: Chapter 8. AREC-ECON 535 Lec F1 1 Serial Correlation or Autocorrelation y t = β 0 + β 1 x 1t + β x t +... + β k

More information

Answer all questions from part I. Answer two question from part II.a, and one question from part II.b.

Answer all questions from part I. Answer two question from part II.a, and one question from part II.b. B203: Quantitative Methods Answer all questions from part I. Answer two question from part II.a, and one question from part II.b. Part I: Compulsory Questions. Answer all questions. Each question carries

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

Econometrics. Week 4. Fall Institute of Economic Studies Faculty of Social Sciences Charles University in Prague

Econometrics. Week 4. Fall Institute of Economic Studies Faculty of Social Sciences Charles University in Prague Econometrics Week 4 Institute of Economic Studies Faculty of Social Sciences Charles University in Prague Fall 2012 1 / 23 Recommended Reading For the today Serial correlation and heteroskedasticity in

More information

Multiple Regression Analysis

Multiple Regression Analysis 1 OUTLINE Basic Concept: Multiple Regression MULTICOLLINEARITY AUTOCORRELATION HETEROSCEDASTICITY REASEARCH IN FINANCE 2 BASIC CONCEPTS: Multiple Regression Y i = β 1 + β 2 X 1i + β 3 X 2i + β 4 X 3i +

More information

Multivariate Time Series Analysis and Its Applications [Tsay (2005), chapter 8]

Multivariate Time Series Analysis and Its Applications [Tsay (2005), chapter 8] 1 Multivariate Time Series Analysis and Its Applications [Tsay (2005), chapter 8] Insights: Price movements in one market can spread easily and instantly to another market [economic globalization and internet

More information

ISSN Article. Selection Criteria in Regime Switching Conditional Volatility Models

ISSN Article. Selection Criteria in Regime Switching Conditional Volatility Models Econometrics 2015, 3, 289-316; doi:10.3390/econometrics3020289 OPEN ACCESS econometrics ISSN 2225-1146 www.mdpi.com/journal/econometrics Article Selection Criteria in Regime Switching Conditional Volatility

More information

ECON2228 Notes 10. Christopher F Baum. Boston College Economics. cfb (BC Econ) ECON2228 Notes / 54

ECON2228 Notes 10. Christopher F Baum. Boston College Economics. cfb (BC Econ) ECON2228 Notes / 54 ECON2228 Notes 10 Christopher F Baum Boston College Economics 2014 2015 cfb (BC Econ) ECON2228 Notes 10 2014 2015 1 / 54 erial correlation and heteroskedasticity in time series regressions Chapter 12:

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

10. Time series regression and forecasting

10. Time series regression and forecasting 10. Time series regression and forecasting Key feature of this section: Analysis of data on a single entity observed at multiple points in time (time series data) Typical research questions: What is the

More information

Lecture 9: Markov Switching Models

Lecture 9: Markov Switching Models Lecture 9: Markov Switching Models Prof. Massimo Guidolin 20192 Financial Econometrics Winter/Spring 2018 Overview Defining a Markov Switching VAR model Structure and mechanics of Markov Switching: from

More information

Modified Variance Ratio Test for Autocorrelation in the Presence of Heteroskedasticity

Modified Variance Ratio Test for Autocorrelation in the Presence of Heteroskedasticity The Lahore Journal of Economics 23 : 1 (Summer 2018): pp. 1 19 Modified Variance Ratio Test for Autocorrelation in the Presence of Heteroskedasticity Sohail Chand * and Nuzhat Aftab ** Abstract Given that

More information

Multiple Regression Analysis: Heteroskedasticity

Multiple Regression Analysis: Heteroskedasticity Multiple Regression Analysis: Heteroskedasticity y = β 0 + β 1 x 1 + β x +... β k x k + u Read chapter 8. EE45 -Chaiyuth Punyasavatsut 1 topics 8.1 Heteroskedasticity and OLS 8. Robust estimation 8.3 Testing

More information

Outline. Possible Reasons. Nature of Heteroscedasticity. Basic Econometrics in Transportation. Heteroscedasticity

Outline. Possible Reasons. Nature of Heteroscedasticity. Basic Econometrics in Transportation. Heteroscedasticity 1/25 Outline Basic Econometrics in Transportation Heteroscedasticity What is the nature of heteroscedasticity? What are its consequences? How does one detect it? What are the remedial measures? Amir Samimi

More information

Problem Set 2: Box-Jenkins methodology

Problem Set 2: Box-Jenkins methodology Problem Set : Box-Jenkins methodology 1) For an AR1) process we have: γ0) = σ ε 1 φ σ ε γ0) = 1 φ Hence, For a MA1) process, p lim R = φ γ0) = 1 + θ )σ ε σ ε 1 = γ0) 1 + θ Therefore, p lim R = 1 1 1 +

More information

Lecture 3: Autoregressive Moving Average (ARMA) Models and their Practical Applications

Lecture 3: Autoregressive Moving Average (ARMA) Models and their Practical Applications Lecture 3: Autoregressive Moving Average (ARMA) Models and their Practical Applications Prof. Massimo Guidolin 20192 Financial Econometrics Winter/Spring 2018 Overview Moving average processes Autoregressive

More information

STAT 350. Assignment 4

STAT 350. Assignment 4 STAT 350 Assignment 4 1. For the Mileage data in assignment 3 conduct a residual analysis and report your findings. I used the full model for this since my answers to assignment 3 suggested we needed the

More information

Gaussian Copula Regression Application

Gaussian Copula Regression Application International Mathematical Forum, Vol. 11, 2016, no. 22, 1053-1065 HIKARI Ltd, www.m-hikari.com http://dx.doi.org/10.12988/imf.2016.68118 Gaussian Copula Regression Application Samia A. Adham Department

More information

:Effects of Data Scaling We ve already looked at the effects of data scaling on the OLS statistics, 2, and R 2. What about test statistics?

:Effects of Data Scaling We ve already looked at the effects of data scaling on the OLS statistics, 2, and R 2. What about test statistics? MRA: Further Issues :Effects of Data Scaling We ve already looked at the effects of data scaling on the OLS statistics, 2, and R 2. What about test statistics? 1. Scaling the explanatory variables Suppose

More information

ARIMA Modelling and Forecasting

ARIMA Modelling and Forecasting ARIMA Modelling and Forecasting Economic time series often appear nonstationary, because of trends, seasonal patterns, cycles, etc. However, the differences may appear stationary. Δx t x t x t 1 (first

More information

FORECASTING OF COTTON PRODUCTION IN INDIA USING ARIMA MODEL

FORECASTING OF COTTON PRODUCTION IN INDIA USING ARIMA MODEL FORECASTING OF COTTON PRODUCTION IN INDIA USING ARIMA MODEL S.Poyyamozhi 1, Dr. A. Kachi Mohideen 2. 1 Assistant Professor and Head, Department of Statistics, Government Arts College (Autonomous), Kumbakonam

More information

MODELLING TIME SERIES WITH CONDITIONAL HETEROSCEDASTICITY

MODELLING TIME SERIES WITH CONDITIONAL HETEROSCEDASTICITY MODELLING TIME SERIES WITH CONDITIONAL HETEROSCEDASTICITY The simple ARCH Model Eva Rubliková Ekonomická univerzita Bratislava Manuela Magalhães Hill Department of Quantitative Methods, INSTITUTO SUPERIOR

More information

Chapter 4. TAR Models

Chapter 4. TAR Models Chapter 4 TAR Models Figure 4.1 shows data on the U.S. Civilian Unemployment Rate. Note that the behavior of the series is asymmetrical the increases are more rapid than the decreases. This is a problem

More information

MULTIPLE REGRESSION AND ISSUES IN REGRESSION ANALYSIS

MULTIPLE REGRESSION AND ISSUES IN REGRESSION ANALYSIS MULTIPLE REGRESSION AND ISSUES IN REGRESSION ANALYSIS Page 1 MSR = Mean Regression Sum of Squares MSE = Mean Squared Error RSS = Regression Sum of Squares SSE = Sum of Squared Errors/Residuals α = Level

More information

ECON2228 Notes 10. Christopher F Baum. Boston College Economics. cfb (BC Econ) ECON2228 Notes / 48

ECON2228 Notes 10. Christopher F Baum. Boston College Economics. cfb (BC Econ) ECON2228 Notes / 48 ECON2228 Notes 10 Christopher F Baum Boston College Economics 2014 2015 cfb (BC Econ) ECON2228 Notes 10 2014 2015 1 / 48 Serial correlation and heteroskedasticity in time series regressions Chapter 12:

More information

LECTURE 11. Introduction to Econometrics. Autocorrelation

LECTURE 11. Introduction to Econometrics. Autocorrelation LECTURE 11 Introduction to Econometrics Autocorrelation November 29, 2016 1 / 24 ON PREVIOUS LECTURES We discussed the specification of a regression equation Specification consists of choosing: 1. correct

More information

Heteroskedasticity. Part VII. Heteroskedasticity

Heteroskedasticity. Part VII. Heteroskedasticity Part VII Heteroskedasticity As of Oct 15, 2015 1 Heteroskedasticity Consequences Heteroskedasticity-robust inference Testing for Heteroskedasticity Weighted Least Squares (WLS) Feasible generalized Least

More information

FinQuiz Notes

FinQuiz Notes Reading 10 Multiple Regression and Issues in Regression Analysis 2. MULTIPLE LINEAR REGRESSION Multiple linear regression is a method used to model the linear relationship between a dependent variable

More information

Lecture 4a: ARMA Model

Lecture 4a: ARMA Model Lecture 4a: ARMA Model 1 2 Big Picture Most often our goal is to find a statistical model to describe real time series (estimation), and then predict the future (forecasting) One particularly popular model

More information

Chapter 8: Model Diagnostics

Chapter 8: Model Diagnostics Chapter 8: Model Diagnostics Model diagnostics involve checking how well the model fits. If the model fits poorly, we consider changing the specification of the model. A major tool of model diagnostics

More information

Circle a single answer for each multiple choice question. Your choice should be made clearly.

Circle a single answer for each multiple choice question. Your choice should be made clearly. TEST #1 STA 4853 March 4, 215 Name: Please read the following directions. DO NOT TURN THE PAGE UNTIL INSTRUCTED TO DO SO Directions This exam is closed book and closed notes. There are 31 questions. Circle

More information

Applied time-series analysis

Applied time-series analysis Robert M. Kunst robert.kunst@univie.ac.at University of Vienna and Institute for Advanced Studies Vienna October 18, 2011 Outline Introduction and overview Econometric Time-Series Analysis In principle,

More information

Using EViews Vox Principles of Econometrics, Third Edition

Using EViews Vox Principles of Econometrics, Third Edition Using EViews Vox Principles of Econometrics, Third Edition WILLIAM E. GRIFFITHS University of Melbourne R. CARTER HILL Louisiana State University GUAY С LIM University of Melbourne JOHN WILEY & SONS, INC

More information

13. Estimation and Extensions in the ARCH model. MA6622, Ernesto Mordecki, CityU, HK, References for this Lecture:

13. Estimation and Extensions in the ARCH model. MA6622, Ernesto Mordecki, CityU, HK, References for this Lecture: 13. Estimation and Extensions in the ARCH model MA6622, Ernesto Mordecki, CityU, HK, 2006. References for this Lecture: Robert F. Engle. GARCH 101: The Use of ARCH/GARCH Models in Applied Econometrics,

More information

FinQuiz Notes

FinQuiz Notes Reading 9 A time series is any series of data that varies over time e.g. the quarterly sales for a company during the past five years or daily returns of a security. When assumptions of the regression

More information

Review of Statistics

Review of Statistics Review of Statistics Topics Descriptive Statistics Mean, Variance Probability Union event, joint event Random Variables Discrete and Continuous Distributions, Moments Two Random Variables Covariance and

More information

Multivariate Time Series: VAR(p) Processes and Models

Multivariate Time Series: VAR(p) Processes and Models Multivariate Time Series: VAR(p) Processes and Models A VAR(p) model, for p > 0 is X t = φ 0 + Φ 1 X t 1 + + Φ p X t p + A t, where X t, φ 0, and X t i are k-vectors, Φ 1,..., Φ p are k k matrices, with

More information

The Size and Power of Four Tests for Detecting Autoregressive Conditional Heteroskedasticity in the Presence of Serial Correlation

The Size and Power of Four Tests for Detecting Autoregressive Conditional Heteroskedasticity in the Presence of Serial Correlation The Size and Power of Four s for Detecting Conditional Heteroskedasticity in the Presence of Serial Correlation A. Stan Hurn Department of Economics Unversity of Melbourne Australia and A. David McDonald

More information

2 Prediction and Analysis of Variance

2 Prediction and Analysis of Variance 2 Prediction and Analysis of Variance Reading: Chapters and 2 of Kennedy A Guide to Econometrics Achen, Christopher H. Interpreting and Using Regression (London: Sage, 982). Chapter 4 of Andy Field, Discovering

More information

TIME SERIES DATA ANALYSIS USING EVIEWS

TIME SERIES DATA ANALYSIS USING EVIEWS TIME SERIES DATA ANALYSIS USING EVIEWS I Gusti Ngurah Agung Graduate School Of Management Faculty Of Economics University Of Indonesia Ph.D. in Biostatistics and MSc. in Mathematical Statistics from University

More information

Read Section 1.1, Examples of time series, on pages 1-8. These example introduce the book; you are not tested on them.

Read Section 1.1, Examples of time series, on pages 1-8. These example introduce the book; you are not tested on them. TS Module 1 Time series overview (The attached PDF file has better formatting.)! Model building! Time series plots Read Section 1.1, Examples of time series, on pages 1-8. These example introduce the book;

More information

Christopher Dougherty London School of Economics and Political Science

Christopher Dougherty London School of Economics and Political Science Introduction to Econometrics FIFTH EDITION Christopher Dougherty London School of Economics and Political Science OXFORD UNIVERSITY PRESS Contents INTRODU CTION 1 Why study econometrics? 1 Aim of this

More information

Oil price volatility in the Philippines using generalized autoregressive conditional heteroscedasticity

Oil price volatility in the Philippines using generalized autoregressive conditional heteroscedasticity Oil price volatility in the Philippines using generalized autoregressive conditional heteroscedasticity Carl Ceasar F. Talungon University of Southern Mindanao, Cotabato Province, Philippines Email: carlceasar04@gmail.com

More information

Chapter 5. Classical linear regression model assumptions and diagnostics. Introductory Econometrics for Finance c Chris Brooks

Chapter 5. Classical linear regression model assumptions and diagnostics. Introductory Econometrics for Finance c Chris Brooks Chapter 5 Classical linear regression model assumptions and diagnostics Introductory Econometrics for Finance c Chris Brooks 2013 1 Violation of the Assumptions of the CLRM Recall that we assumed of the

More information

GARCH Models. Eduardo Rossi University of Pavia. December Rossi GARCH Financial Econometrics / 50

GARCH Models. Eduardo Rossi University of Pavia. December Rossi GARCH Financial Econometrics / 50 GARCH Models Eduardo Rossi University of Pavia December 013 Rossi GARCH Financial Econometrics - 013 1 / 50 Outline 1 Stylized Facts ARCH model: definition 3 GARCH model 4 EGARCH 5 Asymmetric Models 6

More information

Time Series Analysis. James D. Hamilton PRINCETON UNIVERSITY PRESS PRINCETON, NEW JERSEY

Time Series Analysis. James D. Hamilton PRINCETON UNIVERSITY PRESS PRINCETON, NEW JERSEY Time Series Analysis James D. Hamilton PRINCETON UNIVERSITY PRESS PRINCETON, NEW JERSEY PREFACE xiii 1 Difference Equations 1.1. First-Order Difference Equations 1 1.2. pth-order Difference Equations 7

More information

GARCH Models Estimation and Inference

GARCH Models Estimation and Inference Università di Pavia GARCH Models Estimation and Inference Eduardo Rossi Likelihood function The procedure most often used in estimating θ 0 in ARCH models involves the maximization of a likelihood function

More information

Problem set 1 - Solutions

Problem set 1 - Solutions EMPIRICAL FINANCE AND FINANCIAL ECONOMETRICS - MODULE (8448) Problem set 1 - Solutions Exercise 1 -Solutions 1. The correct answer is (a). In fact, the process generating daily prices is usually assumed

More information

Problem Set 2 Solution Sketches Time Series Analysis Spring 2010

Problem Set 2 Solution Sketches Time Series Analysis Spring 2010 Problem Set 2 Solution Sketches Time Series Analysis Spring 2010 Forecasting 1. Let X and Y be two random variables such that E(X 2 ) < and E(Y 2 )

More information

A Non-Parametric Approach of Heteroskedasticity Robust Estimation of Vector-Autoregressive (VAR) Models

A Non-Parametric Approach of Heteroskedasticity Robust Estimation of Vector-Autoregressive (VAR) Models Journal of Finance and Investment Analysis, vol.1, no.1, 2012, 55-67 ISSN: 2241-0988 (print version), 2241-0996 (online) International Scientific Press, 2012 A Non-Parametric Approach of Heteroskedasticity

More information