search for: ccgarch

Displaying 8 results from an estimated 8 matches for "ccgarch".

2009 Feb 04
1
package ccgarch - dcc.estimation
Hello, I am trying to model a bivariate time series called 'residuals' as a dcc-garch model. I want to use the function dcc.estimation(a, A, B dcc.para, dvar, model) to estimate the parameters. No matter how I tried to define a, A and B, I always got the message "Error in constrOptim(theta = para, f = loglik.dcc2, gr = grad.dcc2, ui = resta, : initial value not
2011 May 15
4
DCC-GARCH model
...AdjClose") p2 = get.hist.quote(instrument = "^dji",start = "2005-01-07",end = "2009-09-04",compression = "w", quote="AdjClose") p = cbind(p1,p2) y = diff(log(p))*100 y[,1] = y[,1]-mean(y[,1]) y[,2] = y[,2]-mean(y[,2]) T = length(y[,1]) library(ccgarch) library(fGarch) f1 = garchFit(~ garch(1,1), data=y[,1],include.mean=FALSE) f1 = f1@fit$coef f2 = garchFit(~ garch(1,1), data=y[,2],include.mean=FALSE) f2 = f2@fit$coef a = c(f1[1], f2[1]) A = diag(c(f1[2],f2[2])) B = diag(c(f1[3], f2[3])) dccpara = c(0.2,0.6) dccresults = dcc.estimation(inia=a,...
2012 Oct 13
1
DCC help
hi all, i am using a dcc model for my senior thesis, it looks at stock returns during times of market uncertainty. my current rfile is below. library(SparseM) library(quantreg) library(zoo) library(nortest) library(MASS) library(fEcofin) library(mvtnorm) library(ccgarch) library(stats) library(foreign) #dataset<-read.csv(file="xxxx",header=FALSE) attach(dataset); vardata=data.frame(dataset[,2],dataset[,4]) ### DCC ### #initial values a1 <- c(0.003, 0.001, 0.001) A1 <- diag(c(0.1,0.1,0.1)) B1 <- diag(c(0.1, 0.1, 0.1)) dcc.para <- c(0.01...
2011 May 12
2
DCC-GARCH model and AR(1)-GARCH(1,1) regression model
...AdjClose") p2 = get.hist.quote(instrument = "^dji",start = "2005-01-07",end = "2009-09-04",compression = "w", quote="AdjClose") p = cbind(p1,p2) y = diff(log(p))*100 y[,1] = y[,1]-mean(y[,1]) y[,2] = y[,2]-mean(y[,2]) T = length(y[,1]) library(ccgarch) library(fGarch) f1 = garchFit(~ garch(1,1), data=y[,1],include.mean=FALSE) f1 = f1 at fit$coef f2 = garchFit(~ garch(1,1), data=y[,2],include.mean=FALSE) f2 = f2 at fit$coef a = c(f1[1], f2[1]) A = diag(c(f1[2],f2[2])) B = diag(c(f1[3], f2[3])) dccpara = c(0.2,0.6) dccresults = dcc.estimation(in...
2011 Jul 19
0
Questions about DCC-GARCH Model
Dear list members, I'm trying to use DCC-GARCH model to estimate the correlation. I have downloeaded ccgarch packeage but can't understand some argument in the formula. dcc.estimation(inia, iniA, iniB, ini.dcc, dvar, model, method="BFGS", gradient=1, message=1) which is on R.Help I understand others except "ini.dcc" which is described as "a vector of initial values for the DC...
2011 May 10
0
DCC-GARCH model and AR(1)-GARCH(1, 1) regression model - help needed..
...AdjClose") p2 = get.hist.quote(instrument = "^dji",start = "2005-01-07",end = "2009-09-04",compression = "w", quote="AdjClose") p = cbind(p1,p2) y = diff(log(p))*100 y[,1] = y[,1]-mean(y[,1]) y[,2] = y[,2]-mean(y[,2]) T = length(y[,1]) library(ccgarch) library(fGarch) f1 = garchFit(~ garch(1,1), data=y[,1],include.mean=FALSE) f1 = f1@fit$coef f2 = garchFit(~ garch(1,1), data=y[,2],include.mean=FALSE) f2 = f2@fit$coef a = c(f1[1], f2[1]) A = diag(c(f1[2],f2[2])) B = diag(c(f1[3], f2[3])) dccpara = c(0.2,0.6) dccresults = dcc.estimation(inia=a,...
2009 Sep 27
3
CRAN (and crantastic) updates this week
CRAN (and crantastic) updates this week New packages ------------ * bdoc (1.0) Michael Anderson http://crantastic.org/packages/bdoc This package contains a function that will classify DNA barcodes as well as a few test and reference data sets. * bdsmatrix (1.0) Terry Therneau http://crantastic.org/packages/bdsmatrix This is a special case of sparse matrices, used by coxme and
2012 Apr 15
6
CRAN (and crantastic) updates this week
CRAN (and crantastic) updates this week New packages ------------ * disclapmix (0.1) Maintainer: Mikkel Meyer Andersen Author(s): Mikkel Meyer Andersen and Poul Svante Eriksen License: GPL-2 http://crantastic.org/packages/disclapmix disclapmix makes inference in a mixture of Discrete Laplace distributions using the EM algorithm. * EstSimPDMP (1.1) Maintainer: Unknown Author(s):