Displaying 20 results from an estimated 3000 matches similar to: "arima"
2008 Oct 15
1
Forecasting using ARIMAX
Dear R-helpers,
I would appreicate if someone can help me on the transfer parameter in ARIMAX and also see what I am doing is correct.
I am using ARIMAX with 2 Exogeneous Variables and 10 years data are as follows:
DepVar Period, depVar, IndepVar1 Period, indepVar1, IndepVar2 Period, indepVar2
Jan 1998,708,Jan 1998,495,Jan 1998,245.490
Feb 1998,670,Feb 1998,421.25,Feb 1998,288.170
Mar
2005 Nov 27
1
Question on KalmanSmooth
I am trying to use KalmanSmooth to smooth a time series
fitted by arima (and with missing values), but the $smooth component
of the output baffles me. Look at the following example:
testts <- arima.sim(list(ar=0.9),n=100)
testts[6:14] <- NA
testmod <- arima(testts, c(1,0,0))
testsmooth <- KalmanSmooth(testts, testmod$model)
par(mfrow=c(2,1))
plot(testsmooth$smooth,
2004 Apr 04
1
Sporadic error in kalmanSmooth (PR#6738)
On Sat, 03 Apr 2004 21:34:25 -0400, you wrote:
>Defining the following:
>
> set.seed(123)
>
> kalmanTorture <- function(iter) {
> x <- arima.sim(model = list(ar=0.9, ma=0.5),n=150 )
> x[10:20] <- NA
> mod <- arima(x, order=c(1,0,1) )
> for (i in 1:iter) {
> smooth <- KalmanSmooth(x, mod=mod$model)$smooth
> if (any(is.na(smooth)))
2007 Jan 16
2
ARIMA xreg and factors
I am using arima to develop a time series regression model, I am using arima
b/c I have autocorrelated errors. Several of my independent variables are
categorical and I have coded them as factors . When I run ARIMA I don't
get any warning or error message, but I do not seem to get estimates for all
the levels of the factor. Can/how does ARIMA handle factors in xreg?
here is some example
2008 Jan 11
1
question about xreg of arima
Hi,
I am trying to understand exactly what xreg does in arima. The documentation
for xreg says:"xreg Optionally, a vector or matrix of external regressors,
which must have the same number of rows as x." What does this mean with
regard to the action of xreg in arima?
Apparently somehow xreg made the following two arima fit equivalent in R:
arima(x, order=c(1,1,1), xreg=1:length(x))
is
2004 May 02
1
arima problems when using argument fixed=
As I am reading ?arima, only NA entries in the argument fixed=
imports. The following seems to indicate otherwise:
x <- arima.sim(model=list(ar=0.8), n=100) + (1:100)/50
> t <- 1:100
> mod1 <- lm(x ~ t)
>
> init1 <- c(0, coef(mod1)[2])
> fixed1 <- c(as.numeric(NA), 0)
>
> arima(x, order=c(1,0,0), xreg=t, include.mean=FALSE, init=init1,
fixed=fixed1)
2004 Jan 14
2
Fixed parameters in an AR (or arima) model
Hello
I want to fit an AR model were two of the coefficients are fixed to zero
(the second and third ar-coefficients).
I used the "arima" function with the "fixed" argument but the ar3
coefficient is not set to zero:
==============================================
> arima(Y, order=c(4,0,0), xreg=1:23, fixed=c(NA,0,0,NA,NA,NA))
Call:
arima(x = Y, order = c(4, 0, 0), xreg =
2008 Sep 10
2
arima and xreg
Dear R-help-archive..
I am trying to figure out how to make arima prediction when I have a
process involving multivariate time series input, and one output time
series (output is to be predicted) .. (thus strictly speaking its an
ARMAX process). I know that the arima function of R was not designed
to handle multivariate analysis (there is dse but it doesnt handle
arma multivariate analysis, only
2009 Mar 26
1
arima, xreg, and the armax model
Hello all,
I''m having fun again with the arima function. This time I read in:
http://www.stat.pitt.edu/stoffer/tsa2/R_time_series_quick_fix.htm
<<It has recently been suggested (by a reliable source) that using xreg in
arima() does NOT fit an ARMAX model [insert slap head icon here]. This will
be investigated as soon as time permits.>>
(by R.H. Shumway & D.S. Stoffer)
2008 Nov 27
1
"xreg" in ARIMA modelling.
Hello,
Does anyone know how the parameter estimates are calculated for xreg
variables when called as part of an arima() command, or know of any
literature that provides this info? In particular, I was wondering if there
is a quick way to compare different combinations of "xreg" variables in the
arima() fit in the same way that you would in multiple regression (using AIC
& R^2
2003 Sep 01
1
Arima with an external regressor
Hello,
Does anybody know if the function arima with an external regressor (xreg)
applies the auto correlation on the dependant variable or on the residuals.
In comparison with SAS (proc autoreg), it seems that the auto correlation
applies on the residuals but i'd like to have the confirmation.
I want to estimate:
Y[t] = a[1]*X[t] + a[2] + E[t]
with E[t]=b[1]*E[t-1]
Should I use :
arima(Y,
2004 Mar 04
2
adding trend to an arima model
Hi,
Does anyone know a method for adding a linear/polynominal trend to a
simulated arima model using the arima.sim function?
Any help will be greatly appreciated.
Cheers,
Sam.
2007 Aug 23
1
Estimate Intercept in ARIMA model
Hi, All,
This is my program
ts1.sim <- arima.sim(list(order = c(1,1,0), ar = c(0.7)), n = 200)
ts2.sim <- arima.sim(list(order = c(1,1,0), ar = c(0.5)), n = 200)
tdata<-ts(c(ts1.sim[-1],ts2.sim[-1]))
tre<-c(rep(0,200),rep(1,200))
gender<-rbinom(400,1,.5)
x<-matrix(0,2,400)
x[1,]<-tre
x[2,]<-gender
fit <- arima(tdata, c(1, 1, 0), method = "CSS",xreg=t(x))
2006 Mar 01
6
interrupted time series analysis using ARIMA models
Hi R-users,
I am using arima to fit a time series. Now I would like to include an intervention component "It (0 before intervention, 1 after)" using different types of impacts, that is, not only trying the simple abrupt permanent impact (yt = w It ) with the xreg option but also trying with a gradual permanent impact (yt= d * yt-1 + w * It ), following the filosophy of Box and Tiao
2011 Oct 21
2
Arima Models - Error and jump error
Hi people,
I´m trying to development a simple routine to run many Arima models result
from some parâmeters combination.
My data test have one year and daily level.
A part of routine is:
for ( d in 0:1 )
{ for ( p in 0:3 )
{ for ( q in 0:3 )
{ for ( sd in 0:1 )
{ for ( sp in 0:3 )
{ for ( sq in 0:3 )
{
2006 Jan 02
1
Use Of makeARIMA
Hi R-Experts,
Currently I'm using an univariate time series in which I'm going to
apply KalmanLike(),KalmanForecast (),KalmanSmooth(), KalmanRun(). For I
use it before makeARIMA () but I don't understand and i don't know to
include the seasonal coefficients. Can anyone help me citing a suitable
example? Thanks in advance.
------------------------------------------
2002 Oct 28
4
arima() in for loop
hi all,
In a simulation context I'm running in a for loop the arima() function
for( i in 1:1000){
y<-arima.sim(....)
out<-arima(y,....)
........
}
Everything works, but after some cycle (10, say) I get error due to the
particular y-values simulated. (E.g., a *frequent* error is "Error in
svd(na.omit(xreg)) : 0 extent dimensions") As a
2012 Apr 26
1
Using the R predict function to forecast a model fit with auto.arima function
Hello R users,
Hope everyone is doing great.
I have a dataset that is in .csv format and consists of two columns: one
named Period (which contains dates in the format yyyy_mm) and goes from
1995_10 to 2007_09 and the second column named pcumsdry which is a
volumetric measure and has been formatted as numeric without any commas or
decimals.
I imported the dataset as pauldataset and made use of
2015 May 21
2
Fix for bug in arima function
On 21 May 2015, at 10:35 , Martin Maechler <maechler at lynne.stat.math.ethz.ch> wrote:
>>
>> I noticed that the 3.2.1 release cycle is about to start. Is there any
>> chance that this fix will make it into the next version of R?
>>
>> This bug is fairly serious: getting the wrong variance estimate leads to
>> the wrong log-likelihood and the wrong
2010 Mar 31
1
predict.Arima: warnings from xreg magic
When I run predict.Arima in my code, I get warnings like:
Warning message:
In cbind(intercept = rep(1, n), xreg) :
number of rows of result is not a multiple of vector length (arg 1)
I think this is because I'm not running predict.Arima in the same
environment that I did the fit, so the data object used in the fit is no
longer present. Looking at the predict.Arima source,