Displaying 20 results from an estimated 71 matches for "fgarch".
Did you mean:
garch
2009 Feb 17
1
R crash after fGarch update
Hi folks!
After updating my packages my R seems to have completely crashed as will not
start up - even after I installed 2.8.1 from 2.8.0.
I get the following:
Fatal error: unable to restore saved data in .Rdata
Error in loadNamespeace(name): there is no package called fGarch
But I do have a package called fGarch.
After I hit ok, it crashes and exits. I cannot use any functionality at
all. What do I do?
John
[[alternative HTML version deleted]]
2011 Sep 28
1
fGarch - Fitting and APARCH-Modell with fixed delta
Hi there,
I'm trying to fit a GJR-GARCH Model using fGarch. I wanted to try that by
fitting an APARCH model with a fixed delta of 2 and a non-fixed gamma. So I
was simply trying to use:
spec <- garchFit(~aparch(1,1),data=garchSim(),delta=2)
coef(spec)
And sometimes, it's working like a charm and delta is indeed exactly 2 in
the resulting coefficie...
2011 Mar 24
1
Problems with predict in fGarch
Hello. I am using fGarch to estimate the following model:
Call:
garchFit(formula = fmla, data = X[, i], trace = F)
Mean and Variance Equation:
data ~ arma(1, 1) + garch(1, 1)
Conditional Distribution:
norm
Coefficient(s):
mu ar1 ma1 omega alpha1 beta1
-0.94934 1.00000 -0.23211 54.0640...
2010 Aug 15
2
fGarch: how to use garchFit() in loop?
Dear expeRts,
How can I specify the order p,q of a GARCH(p,q) model within a loop? Here's a minimal example showing that an "Formula and data units do not match"-error appears:
library(fGarch)
spec <- garchSpec(model = list(alpha = 0.1, beta = c(0.4, 0.4)))
data <- garchSim(spec, n = 100)
x <- list()
for(q in 1:3){
print(q)
x[q] <- list(garchFit(~garch(1,q),data=data,trace=FALSE))
}
Cheers,
Marius
2013 Oct 24
1
installing package from source
Hi R users,
Currently I want to fit a FIGARCH model to a dataset. The only package that
allow for it that I could find is fGarch. However it seems that the FIGARCH
model class fitting of this package has been moved to Oxmetrics. I tried to
install the old versions of it using 'tar.gz' files from CRAN archive
http://cran.r-project.org/src/contrib/Archive/fGarch/
<http://cran.r-project.org/src/contrib/Archive/fGarc...
2008 Apr 07
2
tcltk issue remains
Dear R-help,
I'm trying to load the fGarch package and keep running into problems
with tcltk:
After succesfully instaling fGarch (and dependencies) I get:
>library(fGarch)
Loading required package: fBasics
Loading required package: fImport
Loading required package: fSeries
Loading required package: robustbase
Loading required packag...
2009 Jun 30
1
garchFit in fGarch fitted values are all the same
Dear all-
Package /fGarch/ version 2100.78 in R version 2.8.1 (2008-12-22)
running on linux 2.6.22.9-91.fc7
In trying to fit garch models in above environment. I am getting
"reasonable" fitted coefficients, but the fitObject@fitted are all the
same. This is true even for the help page example:
library(fGarch...
2009 Apr 06
1
Problem with Extracting Fitted Values from fGarch package
Good day everyone,
I fitted a GARCH model to a time series and R estimated the model and provide me with the estimates. However, when I tried to extract the fitted values from the estimated model I got the following error message:
"Error in .local(object, ...) : object "fit" not found"
I used the following to extract the fitted values
fitted_TASI <- fitted(garchFit(~
2008 Dec 30
1
A mistake in garchFit()? {fGarch}
Hello,
I was using garchFit {fGarch} to fit some GARCH processes.
I noticed that the result contains "Log Likelihood" value (right above
"Description"), but when I use .. at fit$llh to retrieve Log Likelihood value,
the sign switched.
I am confused about which value I should choose to report...
Any help here?
Tha...
2011 Jan 31
0
Applying previously fitted fGarch model
Greetings,
Suppose I fit an fGarch model via garchFit function for a time series X.
I'm wondering is there any easy way to apply the fitted model to a different
time series Y to calculate conditional variances and standardized residuals?
Thanks.
--
View this message in context: http://r.789695.n4.nabble.com/Applying-previously...
2011 Nov 06
0
fGarch: garchFit and include.shape/shape parameters
Hello,
The function garchFit in the package fGarch allows for choosing a
conditional distribution, one of which is the t-distribution. The function
allows specification of the shape parameter of the distribution (equal to
the degrees of freedom for the t-distribution), for which the default is set
to 4. The function also includes an option "in...
2009 Jan 30
1
Methods not loaded in R-Devel vs 2.8.1
...d "residuals" for two classes. In version 2.8.1 these two are reported whereas in R-Devel (2009-01-28 r47766). What have I missed? What has changed and how can I rectify the issue? Your help and pointers are welcome.
For 2.8.1:
**********
> library(gogarch)
Loading required package: fGarch
Loading required package: timeDate
Loading required package: timeSeries
Loading required package: fBasics
Loading required package: MASS
Warning message:
package 'gogarch' was built under R version 2.9.0
> showMethods("residuals")
Function: residuals (package stats)
object=&qu...
2009 Mar 03
0
Monte carlo simulation in fGARCH
I use fGarch package to estimate AR(1)-ARCH(1) process for a vector of returns. Then, using the estimated parameters I want to simulate 10 000 sample paths where each path has the same length as the vector of returns. So the first line of the code is: spec=garchSpec(model=list(ar= 0.440270860, omega=0.0003743...
2010 Jul 14
0
fGarch: garchFit() with fixed coefficents
...t) using the same model found
for my training set. So basically what I would like is to fit an ARMA-GARCH
model but with predetermined coefficients. If you have any ideas please
share them with me...I will be very grateful.
Thanks,
G
--
View this message in context: http://r.789695.n4.nabble.com/fGarch-garchFit-with-fixed-coefficents-tp2289304p2289304.html
Sent from the R help mailing list archive at Nabble.com.
2013 Feb 17
0
forecast ARMA(1,1)/GARCH(1,1) using fGarch library
....0346774990 0.0118739830
0.0052995170 0.0353007620 -0.0107292230 0.0027573530 -0.0021998170
-0.0016535000 0.0083732060 0.0074824350
For modelling the mean i fit an ARMA(1,1) and fot the volatility
i fit a GARCH(1,1) , i used a t-student as conditional distribution,
for this i used the fGarch librray, the code is the following:
h<-garchFit(~arma(1,1)+garch(2,2),data=R,cond.dist="std",TRACE=F)
On the other hand, for the prediction i use the function "predict".
predict(h,10)
meanForecast meanError standardDeviation
1 0.001451401 0.01531682 0.0153...
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
.............................................................
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 function the wrong way, but cannot fi...
2011 Jul 27
0
problems with predict in fGarch
Hello I am trying to use predict from an arma-Garch model (arma(2, 2) +
garch(1, 1)) and I am getting the following error:
Error en arima(x = object@data, order = c(max(u, 1), 0, max(v, 1)), init =
c(ar, :
non-stationary AR part from CSS
Does anybody know what can be the reason of this error? The model I have
estimated is the following:
Title:
GARCH Modelling
Call:
garchFit(formula =
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 Nov 04
1
AIC in time series
Hi everybody,
I have fitted an ar(1),Garch(1,1) model to some observations with the
help of the garchFit function which is in the fGarch package. Here
what I've done:
library("fGarch")
fit = garchFit(formula=~ar(1)+~garch(1,1), data=garat)
Now I want to count AIC for this model. How can I do it? I cannot do
it with the AIC function of stats package, because R tells me:
"Error in UseMethod("logLik") :...