Let’s consider a very general setup for GARCH(1,1) process where we do not assume that the GARCH residuals
Has expected value equal to zero, i.e. .
Has NOT necessary a second moment that is constant and equal to one, i.e. possibly time dependent (deterministic).
Has NOT necessary a fourth moment that is constant and equal to 3, i.e. possibly time dependent (deterministic).
The process we refer to has the form of a standard GARCH(1,1), i.e. where .
22.1 First moment
22.1.1 Short-term
Given the information at time , the expected value of the GARCH variance after -steps can be expanded as: with and where in general The iteration between two consecutive times reads
Proof: GARCH(1,1) iterative expectation
Proof. Let’s start by taking the conditional expectation of the GARCH(1,1) variance at time given the information up to . In this case it is fully known at time given the information in , i.e. Then, let’s iterate the expectation at time , i.e. and let’s substitute the expression for the squared residuals . Since at time is known we have: where Iterating the expectation at time Then, at time In general, after -steps one can write the expansion with the convention that an empty product is 1.
Example: GARCH(1,1) iterative first moment
Example 22.1 Expanding the expression in Equation 22.1 with one obtain with with and so on.
Functions expectation of GARCH variance.
#' Formula for conditional first moment of GARCH variance#' #' @param h integer, number of steps ahead. #' @param omega numeric, intercept of the model. #' @param alpha numeric, arch parameter of the model. #' @param beta numeric, garch parameter of the model. #' @param e_x2 numeric, second moment of ut. #' @param e_x4 numeric, fourth moment of ut. #' @param sigma2_t numeric, last value of the variance at time t-1. # Conditional first moment GARCH variance (exact)e_sigma2_h_mix <-function(h, omega, alpha, beta, e_x2 =1, sigma2_t){ sigma2_h <-c(sigma2_t)# Second moment m2 <- e_x2if (length(e_x2) ==1& h >1){ m2 <-rep(e_x2, h) }# Derived quantities lambda <- alpha * m2 + beta lambda_prod <-c(1, lambda[h:1][-1])#lambda_prod <- cumprod(lambda_prod) sigma2_h <-c(sigma2_t, omega *cumsum(cumprod(lambda_prod)) + sigma2_t *cumprod(lambda))names(sigma2_h) <-paste0("t+", 0:h)return(sigma2_h)}#' Iteration for conditional first moment of GARCH variance#' #' @param h integer, number of steps ahead. #' @param omega numeric, intercept of the model. #' @param alpha numeric, arch parameter of the model. #' @param beta numeric, garch parameter of the model. #' @param e_x2 numeric, second moment of ut. #' @param e_x4 numeric, fourth moment of ut. #' @param sigma2_t numeric, last value of the variance at time t-1. e_sigma2_h_iter <-function(h, omega, alpha, beta, e_x2 =1, sigma2_t){# Manual iteration sigma2_h <-c(sigma2_t)# Second moment m2 <- e_x2if (length(e_x2) ==1& h >1){ m2 <-rep(e_x2, h) }for(i in1:h){ sigma2_h[i+1] <- omega + (alpha * m2[i] + beta) * sigma2_h[i] }names(sigma2_h) <-paste0("t+", 0:h)return(sigma2_h)}
Moment
Step
Formula
Iteration
Difference. (%)
0
1.200
1.200
0%
1
1.235
1.235
0%
2
1.250
1.250
0%
3
1.258
1.258
0%
4
1.261
1.261
0%
5
1.263
1.263
0%
6
1.263
1.263
0%
7
1.264
1.264
0%
8
1.264
1.264
0%
9
1.264
1.264
0%
10
1.264
1.264
0%
Table 22.1: Forecasted expectation of GARCH(1,1) variance with iteration and with formula.
22.1.2 Long-term
If is constant for all then, , became a constant and the formula simplifies to where denotes the long-term expected GARCH variance as , i.e. It follows that, under the standard assumption that , then one obtain the classic expression where denotes the unconditional expectation as Equation 22.4 with .
GARCH(1,1) long-term expectation
Proof. Let’s verify the formula in Equation 22.5 for constant (Equation 22.2) for all , i.e. In this case the iterative formula (Equation 22.1) simplifies, i.e. Taking the limit as gives the long term stationary variance, i.e. Hence, the general expression became
Example: GARCH(1,1) long-term first moment
Example 22.2
Unconditional expected value of GARCH(1,1) variance
Table 22.2: Forecasted long-term expectation of GARCH(1,1) variance with formula and by Monte Carlo simulations.
22.2 Second moment
22.2.1 Short term
The second moment admits an iterative formula, i.e. where while with as in Equation 22.2.
Proof: Iterative formula for the second moment of GARCH(1,1) variance
Proof. Starting from and substitute the definition of , i.e. Then, let’s take the conditional expectation on both sides: where . Then note that: Hence, we can write the expectation in terms of the previous expectation. where . Iterating at time : At time Hence, in general where we denote as
Example: GARCH(1,1) iterative second moment
Example 22.3 With With With and so on.
Iterative formula for second moment of GARCH variance.
Table 22.3: Forecasted second moment of GARCH(1,1) variance with iteration and with formula.
22.2.2 Long-term
If and are constant for all then the formula simplifies to where denotes the long-term expected GARCH variance as , i.e. It follows that, under normality we have that and . Substituting, one obtain the same result as in Bollerslev (1986), i.e.
GARCH(1,1) long-term second moment
Proof. Under the assumption of constant second and fourth moments of one can simplify the expressions, i.e. Recalling the expression of the expectation of the GARCH variance with constant moments in Equation 22.3 one can write Substituting the above expression into Equation 22.6 one obtain Notably and Hence, Taking the limit as , the second and third terms converges to zero if , therefore More explicitly,
Long-term formula for second moment of GARCH variance.
Table 22.5: Forecasted variance of GARCH(1,1) variance with iteration and with formula.
Moment
Formula
MonteCarlo
Difference
0.0510995
0.0510973
0.0043%
Table 22.6: Forecasted long-term variance of GARCH(1,1) variance with formula and by Monte Carlo simulations.
22.4 First moment
22.4.1 Short term
The expected value of the GARCH std. deviation can be approximated as with a Taylor expansion
Approximated GARCH(1,1) std. deviation with Taylor expansion
Proof. Let’s be a non-negative random variable, and let’s say one want to approximate: Let and expand around the point , i.e. and take the expectation where and . Applying this result to the random variable with and let’s approximate around the expected value with a Taylor expansion, i.e. Taking the expectation gives the result.
Table 22.10: Long-term variance of GARCH(1,1) std. deviation with approximated formula and by Monte Carlo simulations.
22.6 Third moment
22.6.1 Short term
The expected value of can be approximated with a Taylor expansion, i.e. . Then, we can approximate
Example: GARCH(1,1) std. deviation iterative third moment.
Example 22.9
Iterative formula for third moment of GARCH std. deviation.
# Conditional third moment GARCH std. dev (approximated)e_sigma32_h_mix <-function(h, omega, alpha, beta, e_x2 =1, e_x4 =3, sigma4_0){# Expectation variance e_sigma2 <-e_sigma2_h_mix(h, omega, alpha, beta, e_x2, sqrt(sigma4_0))# Variance variance v_sigma2 <-v_sigma2_h_mix(h, omega, alpha, beta, e_x2, e_x4, sigma4_0)# Moment to power 3/2 (Approximated) e_sigma2^(3/2) + (3/8) * v_sigma2 /sqrt(e_sigma2)}# Conditional third moment GARCH std. dev (approximated)e_sigma32_h_iter <-function(h, omega, alpha, beta, e_x2 =1, e_x4 =3, sigma4_0){# Expectation variance e_sigma2 <-e_sigma2_h_iter(h, omega, alpha, beta, e_x2, sqrt(sigma4_0))# Variance variance v_sigma2 <-v_sigma2_h_iter(h, omega, alpha, beta, e_x2, e_x4, sigma4_0)# Moment to power 3/2 (Approximated) e_sigma2^(3/2) + (3/8) * v_sigma2 /sqrt(e_sigma2)}
Moment
step
Formula
Iteration
Difference
0
1.314534
1.314534
0%
1
1.383623
1.383623
0%
2
1.413526
1.413526
0%
3
1.426837
1.426837
0%
4
1.432849
1.432849
0%
5
1.435585
1.435585
0%
6
1.436836
1.436836
0%
7
1.437408
1.437408
0%
8
1.437670
1.437670
0%
9
1.437791
1.437791
0%
10
1.437846
1.437846
0%
Table 22.11: Forecasted third moment of GARCH(1,1) std. deviation with iteration and with formula.
22.6.2 Long term
With a Taylor approximation, the long term third moment of the GARCH std. deviation reads
Example: GARCH(1,1) std. deviation long-term third moment.
Example 22.10
Long-term third moment of GARCH std. deviation.
# Unconditional third moment GARCH std. dev (approximated)e_sigma32_inf <-function(omega, alpha, beta, e_x2 =1, e_x4 =3){# Expectation GARCH variance e_sigma2 <-e_sigma2_inf(omega, alpha, beta, e_x2)# Variance GARCH variance v_sigma2 <-v_sigma2_inf(omega, alpha, beta, e_x2, e_x4)# Moment to power 3/2 (Approximated) e_sigma2^(3/2) + (3/8) * v_sigma2 /sqrt(e_sigma2)}
Moment
Formula
MonteCarlo
Difference
1.437893
1.436871
0.071%
Table 22.12: Long-term third moment of GARCH(1,1) std. deviation with approximated formula and by Monte Carlo simulations.
22.7 Covariance
The covariance between two GARCH variances at time and reads: For a fixed and general and ,
Proof: Iterative formula for the covariance between GARCH(1,1) variances
Proof. Leveraging the tower property and conditioning one can write: From our previous result we have: Hence, By definition the covariance: and simplify the first and last terms cancel and the one remain with