similar to: Comparison between GARCH and ARMA

Displaying 20 results from an estimated 3000 matches similar to: "Comparison between GARCH and ARMA"

2009 Apr 29
1
arma model with garch errors
Dear R experts, I am trying to estimate an ARMA 2,2 model with garch errors. I used the following code on R 2.9. #library library(fGarch) #data data1<-ts(read.table("C:/Users/falcon/Desktop/Time Series/exports/goods1.csv"), start=c(1992,1), frequency=12) head(data1) #garch garchFit(formula.mean= ~arma(2,2),formula.var=~garch(1,1), data=data1) but get this error: >
2005 Dec 13
1
fSeries
I'm trying to use garchFit from fSeries, with Student or Skewed Student conditionnal distribution. Let's say that eps (vector) is my series of daily log-returns: data(EuStockMarkets) eps = diff(log(EuStockMarkets[,"CAC"])) library(fSeries) g = garchFit(series = eps, formula.var = ~garch(2,2), cond.dist = "dstd") s = g at fit$series All the coefficients are ok
2009 Jun 19
1
using garchFit() to fit ARMA+GARCH model with exogeneous variables
Hello - Here's what I'm trying to do. I want to fit a time series y with ARMA(1,1) + GARCH(1,1), there are also an exogeneous variable x which I wish to include, so the whole equation looks like: y_t - \phi y_{t-1} = \sigma_t \epsilon_t + \theta \sigma_{t-1} \epsilon_{t-1} + c x_t where \epsilon_t are i.i.d. random variables \sigma_t^2 = omega + \alpha \sigma_{t-1}^2 + \beta
2008 Aug 18
1
ARMA(0,2) & GARCH(1,1) - code & hessian
Hello R-list-members, I'm trying to model ARMA(0,2) & GARCH(1,1) process using the code below, but according to my textbook, the estimated parameters are wrong. The MA-parameters should be negative. (I've got the same problem using garchFit()). Can anyone tell me what I'm doing wrong? And how can I calculate the hessian matrix? Many thanks, Desislava Kavrakova Code:
2009 Jun 23
1
Forecast GARCH model
Hi, I've fitted a GARCH(1,1) for the residuals of my time serie (X). X is an ARMA(1,1) process. Now I want to do a n-step forecast for X, knowing these processes. How can I do this? I know that there's a command: predict() for ARIMA processes and so on, but what about GARCH? I've got: arma=arima(x, order=c(1,0,1)) (...) garch11<-garch(residuals(x),order = c(1, 1))
2004 Feb 03
2
How to build a AR(q)-GARCH(q) process ?
Hello all, I would like how to modelized a time serie with AR-ARCH process. It can be used arma and garch functions in tseries package for build ar process or a garch process, but how can it be modelized a ar-garch model ? Thanks [[alternative HTML version deleted]]
2010 Mar 17
1
Reg GARCH+ARIMA
Hi, Although my doubt is pretty,as i m not from stats background i am not sure how to proceed on this. Currently i am doing a forecasting.I used ARIMA to forecast and time series was volatile i used garchFit for residuals. How to use the output of Garch to correct the forecasted values from ARIMA. Here is my code: ###delta is the data fit<-arima(delta,order=c(2,,0,1)) fit.res <-
2008 Mar 24
0
ARCH(1,0) with t-residuals
Dear R users, I need to estimate an ARCH(1,0) model with t-residuals. To do this I use garchFit function from fGarch library. However, I get the following error message: Error in.garchInitParameters (formula.mean = formula.mean, formula.var = formula.var, ): object "alpha" not found I tried to estimate this model with different series, but I always get this error message. For example,
2013 Apr 08
0
Maximum likelihood estimation of ARMA(1,1)-GARCH(1,1)
Hello Following some standard textbooks on ARMA(1,1)-GARCH(1,1) (e.g. Ruey Tsay's Analysis of Financial Time Series), I try to write an R program to estimate the key parameters of an ARMA(1,1)-GARCH(1,1) model for Intel's stock returns. For some random reason, I cannot decipher what is wrong with my R program. The R package fGarch already gives me the answer, but my customized function
2010 Aug 23
1
Fitting a GARCH model in R
Hi, I want to fit a mean and variance model jointly. For example I might want to fit an AR(2)-GARCH(1,1) model i.e. r_t = constant_term1 + b*r_t-1 + c*r_t-2 + a_t where a_t = sigma_t*epsilon_t where sigma^2_t = constant_term2 + p*sigma^2_t-1 + q*a^2_t-1 i.e. R estimates a constant_term1, b, c, constant_term2, p, q TIA Aditya
2011 May 04
1
fGarch
Hi, I am attempting to fit a ARMA/GARCH regression model without success. ### ARIMA-GARCH model with regressor ### ### Time series data: A multivariate data set. cov.ts.dq = cov.ts[1:4,"dq1"][!is.na(cov.ts[,"dq1"])] cov.ts.day = ts.intersect(dq = diff(q.ts), day = lag(q.ts, -1)) ### The following R scripts work: (summary(no.day.fitr <- garchFit(dq ~ arma(0,3) +
2008 Apr 01
1
garch prediction
Hello I want to predict the future values of time series with Garch When I specified my model like this: library(fGarch) ret <- diff(log(x))*100 fit = garchFit(~arma(1,0,0)+garch(1, 1), data =ret) predict(fit, n.ahead = 10) meanForecast meanError standardDeviation 1 0.01371299 0.03086350 0.03305819 2 0.01211893 0.03094519 0.03350248
2011 May 12
2
DCC-GARCH model and AR(1)-GARCH(1,1) regression model
Hello, I have a rather complex problem... I will have to explain everything in detail because I cannot solve it by myself...i just ran out of ideas. So here is what I want to do: I take quotes of two indices - S&P500 and DJ. And my first aim is to estimate coefficients of the DCC-GARCH model for them. This is how I do it: library(tseries) p1 = get.hist.quote(instrument =
2011 Jun 04
0
[R-SIG-Finance] Measure quality of fit for MA(q), ARMA(p, q) and GARCH(p, q)
Thank you so much all for your invaluable inputs. On Sat, Jun 4, 2011 at 3:36 AM, Patrick Burns <patrick at burns-stat.com> wrote: > A common thing to do is the Ljung-Box > test on the residuals. ?For garch it > would be the residuals squared. > > Actually for garch it should be the > rank of the squared residuals -- see >
2008 Aug 18
1
another GARCH problem
Hallo, i want to fit a GARCH model with a extern regressor (without arma components), so i found the following function in package fGarch. I tryed out a lot of things but usually I get this Error. > garchFit(formula=y~x, formula.var=~garch(1,1),data=w) Error in .garchFit(formula.mean, formula.var, series = x, init.rec, delta, : Algorithm only supported for mci Recursion I think i use the
2013 Feb 17
0
forecast ARMA(1,1)/GARCH(1,1) using fGarch library
Hi, i am working in the forecast of the daily price crude . The last prices of this data are the following: 100.60 101.47 100.20 100.06 98.68 101.28 101.05 102.13 101.70 98.27 101.00 100.50 100.03 102.23 102.68 103.32 102.67 102.23 102.14 101.25 101.11 99.90 98.53 96.76 96.12 96.54 96.30 95.92 95.92 93.45 93.71 96.42 93.99 93.76 95.24 95.63 95.95 95.83 95.65
2002 Aug 05
1
Modified ARMA function
R-guRus , ARMA function in tseries, seems to be calculating the AR coeff 's as coef <- lm(xx[,1]~xx[,lag$ar+1])$coef [*snipped* from around line 77,] I'd like to modify this model with another term somewhat in these lines lm(xx[,1] ~xx[,lag$ar+1]+mvgsignal)$coef where mvgsignal is a moving average signal based on some indicators, the question is could i simply hack into
2006 Apr 26
2
garch in tseries
Hello again! Is there a way to include a mean in the garch function in the library(tseries), please? I tried include.mean=T in the function statement but it didn't work thanks in advance! R Version 2.2.1 Windows Sincerely, Erin mailto: hodgess at gator.uhd.edu
2013 Mar 12
1
rugarch: GARCH with Johnson Su innovations
Hey, I'm trying to implement a GARCH model with Johnson-Su innovations in order to simulate returns of financial asset. The model should look like this: r_t = alpha + lambda*sqrt(h_t) + sqrt(h_t)*epsilon_t h_t = alpha0 + alpha1*epsilon_(t-1)^2 + beta1 * h_(t-1). Alpha refers to a risk-free return, lambda to the risk-premium. I've implemented it like this: #specification of the model
2009 Apr 06
0
ARMA-GARCH package in R?
Hello, Does anyone know about an R-package on multivariate ARMA-GARCH models? Or in Matlab? I would be very grateful if someone could help! Thanks a lot! [[alternative HTML version deleted]]