Re: [R] Question on Simultaneous Equations & Forecasting

2017-07-13 Thread Pfaff, Bernhard Dr.
Hi Frances, I have not touched the system.fit package for quite some time, but to solve your problem the following two pointers might be helpful: 1) Recast your model in the revised form, i.e., include your identity directly into your reaction functions, if possible. 2) For solving your model,

Re: [R] Question on Simultaneous Equations & Forecasting

2017-07-13 Thread Pfaff, Bernhard Dr.
type. Best, Bernhard -Ursprüngliche Nachricht- Von: Berend Hasselman [mailto:b...@xs4all.nl] Gesendet: Donnerstag, 13. Juli 2017 10:53 An: OseiBonsu, Frances Cc: Pfaff, Bernhard Dr.; r-help@r-project.org Betreff: [EXT] Re: [R] Question on Simultaneous Equations & Forecasting Frances

Re: [R] ca.jo function, urca package, singular matrix problem

2015-07-09 Thread Pfaff, Bernhard Dr.
Watch out for the pre-sample values (K = 2); hence you have supplied a dumvar consisting of zeros only, in your first example. Best, Bernhard -Ursprüngliche Nachricht- Von: R-help [mailto:r-help-boun...@r-project.org] Im Auftrag von mrrox Gesendet: Donnerstag, 9. Juli 2015 15:51 An: r-he

Re: [R] where is XMLRPC for R>3.0 for Windows machines

2014-12-19 Thread Pfaff, Bernhard Dr.
Hello Diogo, the package is hosted on Omegahat: http://www.omegahat.org/XMLRPC/ Best wishes, Bernhard -Ursprüngliche Nachricht- Von: R-help [mailto:r-help-boun...@r-project.org] Im Auftrag von Diogo André Alagador Gesendet: Freitag, 19. Dezember 2014 14:03 An: r-help@r-project.

Re: [R] Johansen Test of Cointegration:How to access rows in R output

2015-10-05 Thread Pfaff, Bernhard Dr.
RTFM: help("ca.jo-class") library(urca) example(ca.jo) class(sjf.vecm) slotNames(sjf.vecm) slot(sjf.vecm, "cval") slot(sjf.vecm, "teststat") slot(sjf.vecm, "V") slot(sjf.vecm, "Vorg") Best, Bernhard -Ursprüngliche Nachricht- Von: R-help [mailto:r-help-boun...@r-project.org] Im Auftrag vo

Re: [R] Granger-causality test using vars package

2017-01-23 Thread Pfaff, Bernhard Dr.
Dear T.Riedle, you cannot assign *all* variables as a cause at once. Incidentally, in your example, you missed a 'data(Canada)'. Having said this, you can loop over the variables names and extract the statistic/p-values. These are contained as named list elements 'statistic' and 'p.value' in th

Re: [R] Granger-causality test using vars package

2017-01-23 Thread Pfaff, Bernhard Dr.
e variable. I am struggling with the result as it is not clear to me whether the variable prod Granger-causes e or U or rw. H0 is that prod does not Granger-cause e U rw. What does that mean? How can I find out if prod Granger-causes e, U and rw, respectively i.e. how can I determine that prod

Re: [R] Impose Structure for Exogenous in vars Package

2017-02-27 Thread Pfaff, Bernhard Dr.
Hi Andrew, if I understand your question correctly, then you would like to place constraints for your exogenous variables in some VAR equations. If so, please have a look at ?restrict. As a toy example: library(vars) ?restrict data(Canada) N <- nrow(Canada) ExoVar <- matrix(runif(N)) colnames(E

Re: [R] Impulse response analysis within package vars

2008-08-07 Thread Pfaff, Bernhard Dr.
hello Sam, just rescale the result. Please note that *unit change* refers to the error term. By the same token you can also rescale the impulse responses by making use of the standard deviation of the residuals. Best, Bernhard > >Hi Everyone > > > var.2c <- VAR(Canada,p=2,type="const") > > irf

Re: [R] Writing Rcmdr Plugins

2008-08-21 Thread Pfaff, Bernhard Dr.
Dear Irina, though you asked explicitly for writing a RCommander-plugin package; I just wanted to add that the former approach of tailor-making menues in the Commander still works. That is, just copy your R file with the tcl/tk functions into the /etc directory of the RCommander and include your m

Re: [R] VAR (pckg: vars) and memory problem

2009-08-17 Thread Pfaff, Bernhard Dr.
Dear Bernd, which version of the package vars are you using? Have tried estimating estimating the VAR first and only? Within the function VAR() the equations are estimated by lm(). Would you be so kind and send the result of traceback()? Best, Bernhard >-Ursprüngliche Nachricht- >Von

Re: [R] VAR (pckg: vars) and memory problem

2009-08-18 Thread Pfaff, Bernhard Dr.
.co.uk [mailto:herrdittm...@yahoo.co.uk] >Gesendet: Montag, 17. August 2009 18:27 >An: Pfaff, Bernhard Dr.; r-help@r-project.org >Betreff: Re: AW: [R] VAR (pckg: vars) and memory problem > >Dear Bernard,  > > >Please find attached the output of traceback() below for this >rather

Re: [R] : How wo read stability VAR plot?

2009-09-11 Thread Pfaff, Bernhard Dr.
> > >I have made program code for Vector Auto Regressive in terms >of completing my undergraduate program using R. I have an important >question related to my project. >If I have: >data(Canada) >var.2c <- VAR(Canada, p = 2, type = "const") >var.2c.stabil <- stability(var.2c,

Re: [R] VAR with contemporaneous effects

2010-03-12 Thread Pfaff, Bernhard Dr.
Dear Mitch, have you taken a look at ?SVAR in package (vars), though the inclusion of exogenous variables is currently not supported. In principle, your model form is a simultaneous interdependent multiple equation model. For estimating these kind of models have a look at the package systemfit

Re: [R] adf.test Vs ADF.test...

2009-06-25 Thread Pfaff, Bernhard Dr.
Dear Harry, to complete the picture, for the packages installed on my machine help.search() yielded: > help.search("Dickey") Help files with alias or concept or title matching 'Dickey' using fuzzy matching: CADFtest::CADFtest Hansen's Covariate-Augmented Dickey Fuller

Re: [R] Simulation of VAR

2010-03-29 Thread Pfaff, Bernhard Dr.
Dear Ron, have you had a look at the package dse? Here, ARMA models can be specified and simulated. The only exercise left for you, is to transform the VECM coefficients into their level-VAR values. Best, Bernhard |> -Original Message- |> From: r-help-boun...@r-project.org |> [m

[R] Sweave() within a function: objects not found

2009-11-11 Thread Pfaff, Bernhard Dr.
Dear list subscriber, suppose, I do have a minimal Sweave file 'test.Rnw': \documentclass{article} \begin{document} <>= x @ \end{document} Within R, I define the following function: f <- function(x){ Sweave("test.Rnw") } The call: f(x = 1:10) results in the following error message: > f(x

Re: [R] Sweave() within a function: objects not found

2009-11-12 Thread Pfaff, Bernhard Dr.
> >On 11/11/2009 12:09 PM, Pfaff, Bernhard Dr. wrote: >> Dear list subscriber, >> >> suppose, I do have a minimal Sweave file 'test.Rnw': >> \documentclass{article} >> \begin{document} >> <>= >> x >> @ >> \end{document}

Re: [R] test for causality

2009-11-17 Thread Pfaff, Bernhard Dr.
> > >Hi useRs.. > >I cant figure out how to test for causality using causality() in vars >package > >I have two datasets (A, B) and i want to test if A (Granger)cause B. >How do I write the script? I dont understand ?causality. How Dear Tobias, have a look at example(causality). A Granger-causal

Re: [R] Dickey-Fuller Tests with no constant and no trend

2009-05-18 Thread Pfaff, Bernhard Dr.
Dear Jake, have you had a look at the function 'ud.df()' contained in the package urca? You will find: > library(urca) > args(ur.df) function (y, type = c("none", "drift", "trend"), lags = 1, selectlags = c("Fixed", "AIC", "BIC")) HTH, Bernhard >-Ursprüngliche Nachricht- >Von:

Re: [R] Finding cointegration relations in a VAR(1)

2009-06-04 Thread Pfaff, Bernhard Dr.
>Von: r-help-boun...@r-project.org >[mailto:r-help-boun...@r-project.org] Im Auftrag von >severine.gai...@unil.ch >Gesendet: Donnerstag, 4. Juni 2009 01:43 >An: r-h...@stat.math.ethz.ch >Betreff: [R] Finding cointegration relations in a VAR(1) > >Dear R people, > >I am trying to find the cointeg

Re: [R] Copula package

2009-04-22 Thread Pfaff, Bernhard Dr.
Dear Roslina, question: have you used 'library(copula)' somewhere before the call to 'normalCopula'? Bernhard >-Ursprüngliche Nachricht- >Von: r-help-boun...@r-project.org >[mailto:r-help-boun...@r-project.org] Im Auftrag von Roslina Zakaria >Gesendet: Mittwoch, 22. April 2009 09:45 >

Re: [R] Out-of-sample prediction with VAR

2010-02-08 Thread Pfaff, Bernhard Dr.
Hello Peter, by judging from your code snippet: |> ts_Y <- ts(log_residuals[1:104]); # detrended sales data |> ts_XGG <- ts(salesmodeldata$gtrends_global[1:104]); |> ts_XGL <- ts(salesmodeldata$gtrends_local[1:104]); |> training_matrix <- data.frame(ts_Y, ts_XGG, ts_XGL); |>

Re: [R] Problem launching Rcmdr

2020-03-11 Thread Pfaff, Bernhard Dr.
Good catch, Peter; Cylance might be the culprit - at least I encountered problems by compiling C++ sources and/or building packages with interfaced routines and here a memory checker kicked in. Maybe something akin is happening by launching Rcmdr (tcl/tk)? -Ursprüngliche Nachricht- Von:

Re: [R] VAR function in vars package: find the standard deviation of the error

2013-08-05 Thread Pfaff, Bernhard Dr.
library(vars) data(Canada) mod <- VAR(Canada, p = 2, type = "both") apply(resid(mod), 2, sd) See also, ?summary and in particular the returned list element 'covres'. HTH, Bernhard -Ursprüngliche Nachricht- Von: r-help-boun...@r-project.org [mailto:r-help-boun...@r-project.org] Im Auftra

Re: [R] sorting the VAR model output according to variable names??

2013-04-10 Thread Pfaff, Bernhard Dr.
Dear LondonPhd, assuming that you have assigned 'mod' to your VAR() call, you can run the following: lapply(coef(mod), function(x) x[sort(rownames(x)), ]) In general, the coef-method will retrieve the estimated coefficients and you can then do the reordering to your liking. Best, Bernhard --

Re: [R] The weak exogeneity test in R for the Error Correction Model?

2013-06-04 Thread Pfaff, Bernhard Dr.
Hello Rebecca, Set up your your model as a bivariate VECM (use ca.jo() and create a matrix of your x and y variables) and invoke alrtest() on the returned object as already mentioned by you. See the example section of alrtest for how accomplishing this. Best, Bernhard Dr. Bernhard Pfaff Directo

Re: [R] Diagnostic testing in a VEC

2012-10-09 Thread Pfaff, Bernhard Dr.
Hello Laura, you convert your VEC model to its levl-VAR representation and employ the diagnostic tests you mentioned. This can be accomplished with the functions/methods contained in the package 'vars'. You might want to have a look at the vignette of the latter package. Best, Bernhard -U

Re: [R] package vars doesn´t working

2010-10-19 Thread Pfaff, Bernhard Dr.
Dear Claudio, hard to tell without further information, but I reckon that you: 1) have a secondary library in use 2) have installed the packages 'vars' **and** 'MASS' installed into this secondary library If so, remove the package 'MASS' from this secondary library (it's shipped in the standar

Re: [R] Dickey Fuller Test

2010-10-29 Thread Pfaff, Bernhard Dr.
Dear Cuckovic, although you got already an answer to your post that relates a little bit more on the time series characteristics of your data in question; I will take up on your initial question. Basically, you got trapped by the word 'time series' in the documentation for adf.test(). What is m

Re: [R] question of VECM restricted regression

2011-05-02 Thread Pfaff, Bernhard Dr.
Hello Meilan: 'ect' is shorthand for error-correction-term, 'sd' signify seasonal dummy variables and 'LRM.dl1' is the lagged first difference of the variable 'LRM' (the log of real money demand). HTH, Bernhard > -Ursprüngliche Nachricht- > Von: r-help-boun...@r-project.org > [mailto

Re: [R] MacKinnon critical value

2011-05-06 Thread Pfaff, Bernhard Dr.
Hello Lee, in addition to David's answer, see: ?MacKinnonPValues in package 'urca' (CRAN and R-Forge). Best, Bernhard > -Ursprüngliche Nachricht- > Von: r-help-boun...@r-project.org > [mailto:r-help-boun...@r-project.org] Im Auftrag von David Winsemius > Gesendet: Freitag, 6. Mai 2011

Re: [R] Optimal choice of the threshold u in Peak Over Threshold (POT)Approach

2011-02-11 Thread Pfaff, Bernhard Dr.
Dear Fir, for instance, have a look at the package 'ismev' and the function mrl.plot(). The CRAN task view 'Finance' lists many more packages that address EVT under the topic 'Risk management'. Best, Bernhard > -Ursprüngliche Nachricht- > Von: r-help-boun...@r-project.org > [mailto:r-

Re: [R] VAR with HAC

2011-02-17 Thread Pfaff, Bernhard Dr.
Hello Marta, have you read ?coeftest and ? VAR carefully enough? The function does expect a lm/glm object for x as argument. Hence, the following does work: library(vars) data(Canada) myvar <- VAR(Canada, p = 2, type = "const") lapply(myvar$varresult, coeftest) Best, Bernhard > -Ursprüngl

Re: [R] VAR with HAC

2011-02-17 Thread Pfaff, Bernhard Dr.
ot;, package = "sandwich") <> Best, Bernhard ____ Von: Marta Lachowska [mailto:ma...@upjohn.org] Gesendet: Donnerstag, 17. Februar 2011 17:01 An: Pfaff, Bernhard Dr.; r-help@r-project.org Betreff: Re: AW: [R] VA

Re: [R] Multivariate Granger Causality Tests

2011-03-03 Thread Pfaff, Bernhard Dr.
Dear Hazzard I. Petzev, you might find causality() in the package vars useful. Best, Bernhard > -Ursprüngliche Nachricht- > Von: r-help-boun...@r-project.org > [mailto:r-help-boun...@r-project.org] Im Auftrag von hazzard > Gesendet: Donnerstag, 3. März 2011 10:07 > An: r-help@r-project

Re: [R] Garchoxfit package

2011-03-28 Thread Pfaff, Bernhard Dr.
Dear Ning, are you referring to the deprecated function garchOxFit() of the package fGarch, formerly contained in fSeries? If so: library(sos) findFn("garchOxFit") which yields: http://finzi.psych.upenn.edu/R/library/fGarch/html/00fGarch-package.html And there you will find at the bot

Re: [R] VECM with UNRESTRICTED TREND

2011-03-30 Thread Pfaff, Bernhard Dr.
Hello Greg, you can exploit the argument 'dumvar' for this. See ?ca.jo Best, Bernhard > -Ursprüngliche Nachricht- > Von: r-help-boun...@r-project.org > [mailto:r-help-boun...@r-project.org] Im Auftrag von Grzegorz Konat > Gesendet: Mittwoch, 30. März 2011 16:46 > An: r-help@r-project.o

Re: [R] VECM with UNRESTRICTED TREND

2011-03-31 Thread Pfaff, Bernhard Dr.
that this implies a quadratic trend for the levels. Best, Bernhard Von: Grzegorz Konat [mailto:grzegorz.ko...@ibrkk.pl] Gesendet: Mittwoch, 30. März 2011 20:50 An: Pfaff, Bernhard Dr.; r-help@r-project.org Betreff: Re: [R] VECM wit

Re: [R] VECM with UNRESTRICTED TREND

2011-03-31 Thread Pfaff, Bernhard Dr.
k you once again (especially for your patience). Best, Greg 2011/3/31 Pfaff, Bernhard Dr. Hello Greg, you include your trend as a (Nx1) matrix and use this for 'dumvar'. The matrix 'dumvar

Re: [R] VECM with UNRESTRICTED TREND

2011-03-31 Thread Pfaff, Bernhard Dr.
ngrun", dumvar = trend) Best, Bernhard Von: Grzegorz Konat [mailto:grzegorz.ko...@ibrkk.pl] Gesendet: Donnerstag, 31. März 2011 14:40 An: Pfaff, Bernhard Dr.; r-help@r-project.org Betreff: Re: [R] VECM with UNRESTRICTED TREND

[R] TV VECM (formerly: VECM with UNRESTRICTED TREND)

2011-04-01 Thread Pfaff, Bernhard Dr.
üngliche Nachricht- > Von: renoir vieira [mailto:renoirvie...@gmail.com] > Gesendet: Donnerstag, 31. März 2011 22:27 > An: Grzegorz Konat > Cc: Pfaff, Bernhard Dr.; r-help@r-project.org > Betreff: Re: [R] VECM with UNRESTRICTED TREND > > Dear Pfaff, > > Would that be

Re: [R] Granger Causality in a VAR Model

2011-04-05 Thread Pfaff, Bernhard Dr.
The below email was cross-posted to R-Sig-Finance and has been answered there. > -Ursprüngliche Nachricht- > Von: r-help-boun...@r-project.org > [mailto:r-help-boun...@r-project.org] Im Auftrag von ivan > Gesendet: Montag, 4. April 2011 20:24 > An: r-help@r-project.org > Betreff: [R] Gr

Re: [R] Automatically extract info from Granger causality output

2011-04-15 Thread Pfaff, Bernhard Dr.
Dear Ivan, first, it would pay-off in terms of readability to employ line breaks and second to provide a reproducable code snippet and third which package you have used. Now to your questions: 1) What happens if you provide colnames for your objects? 2) What happens if you omit the $ after count

Re: [R] Automatically extract info from Granger causality output

2011-04-15 Thread Pfaff, Bernhard Dr.
trix(NA, ncol = 1, nrow = length(tl)) for(i in 1:length(tl)){ res[i, ] <- tl[[i]]$Granger$p.value } res hth, Bernhard > -Ursprüngliche Nachricht- > Von: ivan [mailto:i.pet...@gmail.com] > Gesendet: Freitag, 15. April 2011 10:46 > An: Pfaff, Bernhard Dr. > Cc: r-h

Re: [R] SVAR Restriction on AB-model

2012-07-13 Thread Pfaff, Bernhard Dr.
Hello Veronica, what makes you think that this is an error? It is a warning that your specified SVAR-model is **just** identified and hence an over-identification test cannot be conducted. You can suppress this warning by not asking for an over-identification in the first place, by setting lrte

Re: [R] VAR with excluded lags

2011-06-24 Thread Pfaff, Bernhard Dr.
?restrict > -Ursprüngliche Nachricht- > Von: r-help-boun...@r-project.org > [mailto:r-help-boun...@r-project.org] Im Auftrag von gizmo > Gesendet: Mittwoch, 22. Juni 2011 18:26 > An: r-help@r-project.org > Betreff: [R] VAR with excluded lags > > Hi, > > I would like to fit a Vector Aut

Re: [R] BY GROUP in evir R package

2011-07-06 Thread Pfaff, Bernhard Dr.
Hello Peter, str(rg2) us quite revealing for this; by() returns a list and hence lapply() can be employed, e.g.: lapply(rg2, rlevel.gev, k.blocks = 5) By the same token, you can extract the relevant bits and pieces and put them together in a data.frame. Best, Bernhard > -Ursprüngliche N

Re: [R] BY GROUP in evir R package

2011-07-07 Thread Pfaff, Bernhard Dr.
> > > > - Original Message > From: "Pfaff, Bernhard Dr." > To: Peter Maclean ; Dr. Bernhard Pfaff > > Cc: "r-help@r-project.org" > Sent: Wed, July 6, 2011 8:17:12 AM > Subject: AW: [R] BY GROUP in evir R package > > Hello Pet

Re: [R] Using Windows 7 Task Scheduler with R source scripts

2011-07-08 Thread Pfaff, Bernhard Dr.
Hello Dan, I reckon that you need to path a batch-file to the scheduler, i.e. something along the lines R CMD BATCH script.R shall be included in, say, 'RBatchjob.bat' and this file shall then be called by the task scheduler. Best, Bernhard > -Ursprüngliche Nachricht- > Von: r-he

Re: [R] What is the CADF test criterion="BIC" report?

2011-11-14 Thread Pfaff, Bernhard Dr.
Hello Paul, just a guess: different sample sizes! In your first call, the sample is shorter than in your second. Hence, you can test this, if you curtail your data set in your second call and then you should obtain the same result, i.e.: > library(vars) > data(Canada) > test <- summary(CADFtest

Re: [R] Copula Fitting Using R

2011-11-25 Thread Pfaff, Bernhard Dr.
Hello Denis & Fayyad, in principal the advice given is appropriate, but QRMlib has been removed from CRAN lately, due to a glitch with its dependencies and the current version of R. Hence, to get the package installed and does not want to wait until it shows up on CRAN, one should to the follow

Re: [R] Plot method for ca.jo

2012-03-20 Thread Pfaff, Bernhard Dr.
?getMethod getMethod("plot", c("ca.jo", "missing")) -Ursprüngliche Nachricht- Von: r-help-boun...@r-project.org [mailto:r-help-boun...@r-project.org] Im Auftrag von Keith Weintraub Gesendet: Dienstag, 20. März 2012 16:36 An: r-help@r-project.org Betreff: [R] Plot method for ca.jo Folks,

Re: [R] A question on Unit Root Test using "urca" toolbox

2012-02-03 Thread Pfaff, Bernhard Dr.
Hello Miao, short answer: different sample sizes are used in your tests. long answer: in your first instance, the common sample size is determined for the allowance of 12 lags such that one is not comparing test results derived from different sample sizes. And hence, in your second instance, a

Re: [R] Package 'fCalendar'

2012-02-23 Thread Pfaff, Bernhard Dr.
Hello Brit and Michael, indeed, fCalendar was replaced by timeDate (so was fSeries by timeSeries). Old versions of both packages are in the CRAN archive. Now, with respect to QRMlib, the package author/maintainer (cc'ed to this email) is pretty close to a re-submittance of his package to CRAN.

Re: [R] Installing package QRMlib

2012-02-28 Thread Pfaff, Bernhard Dr.
Dear all: well, what Duncan has suggested would work in principle. However, the dependencies of QRMlib as contained in the archive have been deprecated and the package maintainer (cc'ed to this email directly) is pretty close to a re-release of his package on CRAN, whereby primarily the outdate

Re: [R] Installing package QRMlib

2012-02-28 Thread Pfaff, Bernhard Dr.
As stated, you need to install the *deprecated* dependencies of QRMlib as shown in its DESCRIPTION as well as the reverse dependent *deprecated* packages. These can still be fetched from R-Forge (Rmetrics project). The package 'timeSeries' will become a dependency of the to be re-released QRMlib

Re: [R] Installing package QRMlib

2012-02-29 Thread Pfaff, Bernhard Dr.
Well, because QRMlib interfaces C routines (IIRC), the error message is pretty indicative, i.e. these routines cannot be compiled. Now, without further information there is not much to recommend, but: 1) check your RTools installation 2) Ask the package maintainer (cc'ed) when he will re-release

Re: [R] How are the coefficients for the ur.ers, type DF-GLS calculated?

2012-03-01 Thread Pfaff, Bernhard Dr.
Ackbar: have a look at ur.ers directly. The coefficients can be recovered from the slot 'testreg', i.e., example(ur.ers) slotNames(ers.gnp) coef(ers.gnp@testreg) RTFM: help("ur.ers") and help("ur.ers-class") Best, Bernhard -Ursprüngliche Nachricht- Von: r-help-boun...@r-project.org [

Re: [R] Simulate values from VAR

2012-03-01 Thread Pfaff, Bernhard Dr.
Hello Keith, see ?Acoef for retrieving the coefficients. Incidentally, in the package dse simulation methods are made available. Best, Bernhard Dr. Bernhard Pfaff Director Global Asset Allocation Invesco Asset Management Deutschland GmbH An der Welle 5 D-60322 Frankfurt am Main Tel: +49 (0)6

Re: [R] FRB/US

2008-06-19 Thread Pfaff, Bernhard Dr.
Hello Tony, I am not aware of an out-of-the-box solution to your problem. However, in terms of macroeconometric simultaneous equation models, I have used the FP-program (see: http://fairmodel.econ.yale.edu/fp/fp.htm). Prof. Fair is so kind to provide the binaries and sources from his web-site.

Re: [R] Cointegration no constant

2008-03-20 Thread Pfaff, Bernhard Dr.
> >Hi, > >I am trying to estimate a VECM without constant using the >following code: > >data(finland) >sjf <- finland >sjf.reg<-ca.jo(sjf, type = c("eigen"), ecdet = c("none"), K = >2,spec=c("transitory"), season = NULL, dumvar = NULL) >cajools(sjf.reg) > > >While the cointegration test does not

Re: [R] multivariate time series

2008-04-18 Thread Pfaff, Bernhard Dr.
Hello Erin, have you considered the package bundle "dse" on CRAN? Best, Bernhard > >Dear R People: > >I was looking to see if there are any functions for Vector >ARMA modeling. > >I found Vector AR(p) but no Vector ARMAs. > >Thanks, >Erin > > >-- >Erin Hodgess >Associate Professor >Department

Re: [R] question regarding arima function and predicted values

2007-12-12 Thread Pfaff, Bernhard Dr.
>Good evening! > >I have a question regarding forecast package and time series analysis. >My syntax: > >x<-c(253, 252, 275, 275, 272, 254, 272, 252, 249, 300, 244, >258, 255, 285, 301, 278, 279, 304, 275, 276, 313, 292, 302, >322, 281, 298, 305, 295, 286, 327, 286, 270, 289, 293, 287, >267, 26

Re: [R] Need good Reference Material and Reading about Gaussian Copulas

2007-12-12 Thread Pfaff, Bernhard Dr.
Hello Neil, you will find decent and well-written papers on: http://www.math.ethz.ch/~embrecht/ http://www.ma.hw.ac.uk/~mcneil/ http://www.math.uni-leipzig.de/~tschmidt/#publications Best, Bernhard ps: Incidentally, the monograph http://press.princeton.edu/titles/8056.html contains nice ill

Re: [R] How to use R to estimate a model which has two sets of laggedtime series independent variables

2007-12-13 Thread Pfaff, Bernhard Dr.
>Hi, > >I would like to use R to estimate the following model: > >X(t) = a + b1*X(t-1) + b2*X(t-2) + c1*Y(t) + c2*Y(t-1) + c3*Y(t-2) > >Is there any R function that performs this type of estimation? I know >that if I only have one time series (i.e. lagged value of X) on the >right hand side then th

Re: [R] Stationarity of a Time Series

2008-01-22 Thread Pfaff, Bernhard Dr.
Hello Stephen, stationarity tests as well as unit root tests have been implemented in a couple of packages. For instance, as already mentioned: tseries, but also uroot, fUnitRoots and urca. See the annotated task view "Econemtrics" and "Finance" for further information. Best, Bernhard > >kpss.t

Re: [R] dynlm and lm: should they give same estimates?

2008-10-16 Thread Pfaff, Bernhard Dr.
Hello Werner, this is easily clarified. The code in my book contains an error: please replace the line: error.lagged <- error[-c(99, 100)] with error.lagged <- error[-c(1, 100)] I will file this in the errata section on my web-site and will correct the relevant example in the urca and vars pack

Re: [R] using dvi with latex object: directory not correctly set, maybe due to error in shQuote()

2008-12-17 Thread Pfaff, Bernhard Dr.
Hello Marco, as might not be evident at first sight, but have you set the environment variable "R_SHELL"? If you spot at the dvi method for latex you will find a call to sys(), which will call shell() and if the argument shell is unset then the contents of "R_SHELL" will be used. Hence, what do

Re: [R] Download daily weather data

2009-02-27 Thread Pfaff, Bernhard Dr.
Dear Thomas, more for the sake of completeness and as an alternative to R. There are GRIB data [1] sets available (some for free) and there is the GPL software Grads [2]. Because the Grib-Format is well documented it should be possible to get it into R easily and make up your own plots/weather

Re: [R] Multivariate GARCH Package

2009-03-04 Thread Pfaff, Bernhard Dr.
Dear Mohammad, have a look at the finance task view on CRAN: http://cran.at.r-project.org/web/views/Finance.html (Dirk has nicely updated this page recently). In addition, Patrick Burns provides a recipe for PC-GARCH models on his web-site: http://www.burns-stat.com/pages/Working/multgarchuni.

Re: [R] ARCH LM test for univariant time series

2008-02-04 Thread Pfaff, Bernhard Dr.
Dear All, one can visually inspect ARCH-effects by plotting acf/pacf of the squared residuals from an OLS-estimation. This can be as simple as a demeaned series. Further one can run an auxiliary regression by regressing q lagged squared values and a constant on the squared series itself. This tes

Re: [R] ARCH LM test for univariant time series

2008-02-06 Thread Pfaff, Bernhard Dr.
Graves [mailto:[EMAIL PROTECTED] >Gesendet: Mittwoch, 6. Februar 2008 05:02 >An: Pfaff, Bernhard Dr. >Cc: tom soyer; r-help@r-project.org >Betreff: Re: AW: [R] ARCH LM test for univariant time series > >Dear Bernhard: > > Thanks very much. Unless you object, I shall add

Re: [R] Spectral Analysis of Time Series in R

2008-12-03 Thread Pfaff, Bernhard Dr.
Hello Alexander, for (3) see the CRAN-package "vars". Best, Bernhard > >Dear R Community, > >I am currently student at the Vienna University of Technology >writing my >Diploma thesis on causality in time series and doing some analyses of >time series in R. I have the following questions: > >

Re: [R] Vars package - specification of VAR

2008-12-08 Thread Pfaff, Bernhard Dr.
Hello Bernd, by definition, a VAR does only include **lagged endogenous** variables. You might want consider SVAR() contained in the same package, or fit a VECM (see CRAN package 'urca'). Best, Bernhard >Hi useRs, > >Been estimating a VAR with two variables, using VAR() of the >package "vars".

Re: [R] About adf.test

2008-12-08 Thread Pfaff, Bernhard Dr.
Hello Kamlesh, have a look at: fUnitRoots, tseries, urca, uroot Best, Bernhard > >Dear sir, > > I am a new user of R statistical package. I want to perform >adf.test(augmented dickey fuller test), which packages I need >to install in >order to perform it. I am getting following message on my

Re: [R] Cointegration and ECM in Package {urca}

2008-12-16 Thread Pfaff, Bernhard Dr.
> >Dear R Core Team, > > > >I am using package {urca} to do cointegration and estimate ECM model, >but I have the following two problems: > > > >(1)I use ca.jo() to do cointegration first and can get the >cointegration rank, alpha and beta. The next step is to test some >restrictions on beta

Re: [R] Using R for large econometric models

2007-11-07 Thread Pfaff, Bernhard Dr.
Dear Dietrich, in the first place, it would have been helpful to know which kind of econometric models your colleague wants to utilise. With respect to econometric methods you might want to have a look at the CRAN Task Views for econometrics and finance, to see what is already available: http:

Re: [R] Multivariate time series

2007-11-12 Thread Pfaff, Bernhard Dr.
Hello Giusy, in addition to Frank's suggestion you might want to specify and estimate a VECM (function ca.jo() in package urca). This object can be transformed to its level-VAR representation (function vec2var() in package vars) for which a predict-method exists (fan charts can be generated too).

Re: [R] vars package, impulse response functions ??

2007-09-13 Thread Pfaff, Bernhard Dr.
Hello Spencer, impulse response analysis is wrong tool for your investigation. What you are after is the final form of your model, i.e., the endogenous variables are only dependent on your exogenous variables including deterministic regressors: y_t = A(L)^-1 B(L) x_t. The key word is then multipli

Re: [R] statistics - hypothesis testing question

2007-09-14 Thread Pfaff, Bernhard Dr.
Hello Mark, in addition and complementing the already provided answers to your question. You want to consider the J-test, too. For an outline and the pitfalls of this test, see: http://citeseer.ist.psu.edu/cache/papers/cs/24954/http:zSzzSzwww.econ.qu eensu.cazSzfacultyzSzdavidsonzSzbj4-noam.pdf/b