Displaying 20 results from an estimated 500 matches similar to: "Egarch (1,1) with Student t distribution using rugarch"
2012 Oct 25
2
Egarch (1,1) with Student t distribution in RExcel
Hi
I want to implement Egarch (1,1) with t distribution model using RExcel and VBA.
May I know the syntax.
Following is the code that I 'm using.
rinterface.RRun "spec=ugarchspec(variance.model=list(model=(eGARCH),garchOrder=c(1,1)), mean.model=list(armaOrder=c(1,1), arfima=FALSE), distribution.model=(std))"
rinterface.RRun "fit = ugarchfit(Data = b, spec = spec)"
2013 Nov 16
1
r documentation rugarch egarch
Hi,
I`m about to switch from STATA to R and have serious troubles to find proper
documentations on the internet.
Right now I try to find a proper documentation of the eGARCH model being
part of the rugarch package.
Neither here
http://cran.r-project.org/web/packages/rugarch/vignettes/Introduction_to_the_rugarch_package.pdf
nor here
http://cran.r-project.org/web/packages/rugarch/rugarch.pdf
could
2011 Dec 06
1
rugarch package: is this forecast correct?
Let me start with the code:
library(quantmod)
library(rugarch)
getSymbols("SPY", from="1900-01-01")
rets=na.trim(diff(log(Cl(SPY))))
tt = tail(rets["/2004-10-29"], 1000)
spec = ugarchspec(variance.model=list(garchOrder=c(1,1)),
mean.model=list(armaOrder=c(2,5)), distribution.model="sged")
for(ii in 1:10)
{
ttFit = ugarchfit( spec=spec,
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
2012 Sep 18
0
"rugarch" package
My code:
spec<-ugarchspec(variance.model = list(model = "sGARCH", garchOrder = c(1,
1), submodel = "Null", external.regressors = NULL, variance.targeting =
FALSE), mean.model = list(armaOrder=c(0,0),include.mean =FALSE, archm =
FALSE, archpow = 1, arfima = FALSE, external.regressors = NULL, archex =
FALSE), distribution.model = "norm", start.pars = list(),
2010 Sep 13
0
Help with ugarchspec function
Hi
I am using the ugarchspec function from the rgarch package to fit a mean
variance model jointly. Following is the code I'm using:
> spec = ugarchspec(variance.model = list(model="eGARCH",
garchOrder=c(1,1)), mean.model = list(armaOrder=c(1,1)))
On doing this, I get the following error:
Error in ugarchspec(variance.model = list(model = "eGARCH", garchOrder =
c(1,
2004 Aug 02
1
Estimating EGARCH processes with R
Hallo,
I am a student specializing statistics and econometrics in germany. I know there is a way to program EGARCH-processes (time series analyses) in R.
If you are ackquainted with statistics already you know that there is nothing but a theorethical use of GARCH-Package in R. Not only because the distribution is gaussian, but also because the skewdness and leptokurthosis are not quite good
2011 Oct 17
5
Install the rugarch-package
Hi,
i am unable to install the rugarch package.
More than that i do not even find this package in my list of possible
packages.
Its possible than the name has changed, or the package is not longer
availiable?
Is there a similar package avaliable for garch modelling except the fGarch
what i am using now?
many Thanks
Roland
--
View this message in context:
2018 May 22
0
DCC model simulation in R
Hi,
I have used R rmgarch package to implement EGARCH ADCC model from which I
can extract conditional covariance matrix. Now I would like to introduce
positive and/or negative shocks to see the asymmetric response of
covariance. I have come to know that impulse response function (IRF) or
volatility IRF is not compatible for any asymmetric models, therefore, the
only way to introduce shocks into
2010 Aug 06
1
R code for EGARCH
Hi,
Can we run EGARCH in R. If yes, I would be grateful if someone could tell me
the R codes for running EGARCH model.
Thanks.
[[alternative HTML version deleted]]
2012 Sep 05
1
run EGARCH package on REXCEl
Hi,
I have limited experience on R and recently started using REXcel. Although I have been able to run both simple functions (like mean etc) and some complex ones (like Principal Component analysis, PCA) using RExcel, I am facing some problems while running EGARCH model. For this I have downloaded the 'betategarch' package for R to run EGARCH with student t dist. Although the package has
2006 May 24
1
Does R have EGARCH modeling function?
I've downloaded fSeries, but looks like it just has an interface to OX(TM)
Garch Modeling Software,and that OX(TM) software package is not free.
So where can I find an EGARCH function that is truely usable?
Thanks a lot!
[[alternative HTML version deleted]]
2011 Sep 20
1
Data
Hey everybody,
i am using the rugarch-package and its great!
I have a pretty easy problem, but i just dont get it, so thanks if you can
help me.
Normally i use:
/
data(DATANAME)
spec = ugarchspec()
fit = ugarchfit(data = x[,1], spec = spec)
fit
slotNames(fit)
names(fit at fit)
coef(fit)
infocriteria(fit)
likelihood(fit)
nyblom(fit)
signbias(fit)
head(as.data.frame(fit))
head(sigma(fit))
2009 Jul 15
1
Is it possible to use EGARCH and GJR in R?
Hi,
Could you please help me with EGARCH and GJR?
Is it possible to use EGARCH and GJR in R? I have used below mentioned
code
for GARCH in R, but I never used EGARCH and GJR in R.
Thank you in advance!
daten<-read.table("H://Daten//Zeitreihen//dax_1.csv", sep=";", header=T)
DAX.kurs<-daten
DAX.kurs<-ts(DAX.kurs,names="DAX-Kurs")
2013 Jun 16
4
can't install rugarch and nloptr packages in R 3.01 opensuse linux
I can't install rugarch package because installation of nloptr package fails .
I use opensuse 12.3
# uname -a
Linux candide 3.7.10-1.11-desktop #1 SMP PREEMPT Thu May 16 20:27:27 UTC 2013 (adf31bb) x86_64 x86_64 x86_64 GNU/Linux
my gcc version is 4.8.1
I compiled and installed R 3.01 . then I tried to install rugarch package but it fails because it can't install depended package nloptr.
2011 Nov 14
0
rugarch data format?
I am sorry to ask this group but the maintainer of this package did not
leave an email address.
Has anyone used or is using the 'rugarch' package with time-series data
(ts)? I try to fit a GARCH model to my data using the following:
> gf <- ugarchfit(data=l[["MEN"]]$series, spec=spec)
and I get:
Error in .extractdata(data) :
rgarch-->error: class of
2005 Feb 22
1
Does R has the function for garch-t, gjr-garch, qgarch and egarch
Dear all,
I would like to know that R has the function for garch-t,gjr-
garch,qgarch and egarch.
Best Regards,
Luck
2017 Jul 29
1
rugarch package: VaRTest()
Dear all,
I want to backtest my Value at Risk output using the VaRTest() function in the rugarch package. I do not understand if the numeric vector of VaR which needs to be calculated is in negative or positive terms. Usually VaR is expressed in positive terms.
Do I have to use positive values for VaR in the VaRTest() formula?
Thanks for your help.
[[alternative HTML version deleted]]
2012 Jul 26
1
gamma distribution in rugarch package
Hi guys,
does anyone know if there is the possibility to fit a gamma distribution
using ugarch?honestly i don't know if maybe is possible to fix some
parameters that reduce ghyp or ged in a gamma distribution..
thanks a lot
sara
--
View this message in context: http://r.789695.n4.nabble.com/gamma-distribution-in-rugarch-package-tp4637893.html
Sent from the R help mailing list archive at
2012 May 18
3
look at the underlying source code
hi
someone can show me how can i get the source code of a function. Is a S4
class or Method. (I'm not an expert in R environment)
Exactly, Function "ugarchsim" from library (rugarch).
I need to know (in detailed ) how the variance and mean ecuation of a
arma/garch process are calculated.
With other packages like "fGarch" i used to invoked the function debug ()
and allows