Title: | Periodic Autoregressive Time Series Models |
---|---|
Description: | Basic functions to fit and predict periodic autoregressive time series models. These models are discussed in the book P.H. Franses (1996) "Periodicity and Stochastic Trends in Economic Time Series", Oxford University Press. Data set analyzed in that book is also provided. NOTE: the package was orphaned during several years. It is now only maintained, but no major enhancements are expected, and the maintainer cannot provide any support. |
Authors: | Javier Lopez-de-Lacalle [aut, cph],
Matthieu Stigler [cre] |
Maintainer: | Matthieu Stigler <[email protected]> |
License: | GPL-2 |
Version: | 1.1-3 |
Built: | 2025-03-02 05:49:08 UTC |
Source: | https://github.com/matthieustigler/partsm |
This function is based on the acf function and extends it by allowing for some transformations of the data before computing the autocovariance or autocorrelation function.
acf.ext1 (wts, transf.type, perdiff.coeffs, type, lag.max, showcat, plot)
acf.ext1 (wts, transf.type, perdiff.coeffs, type, lag.max, showcat, plot)
wts |
a univariate time series object. |
transf.type |
a character string indicating what transformation should be applied to the data. Allowed values are "orig", "fdiff", "sdiff", "fsdiff", "fdiffsd", "perdiff", and ""perdiffsd. See details. |
perdiff.coeffs |
a vector with the estimates coefficients for the periodic difference filter. This argument is only required when the periodic difference transformation must be applied to the data. See details. |
type |
a character string giving the type of acf to be computed. Allowed values are "correlation", "covariance" or "partial". |
lag.max |
maximum number of lags at which to calculate the acf. |
showcat |
a logical. If TRUE, the results are printed in detail. If FALSE, the results are stored as a list object. |
plot |
a logical. If TRUE, a plot of the acf is showed. |
The implemented transformations are the following:
"orig": Original series.
"fdiff": First differences of the original series.
"sdiff": Seasonal differences of the original series.
"fsdiff": Fisrt and seasonal differences of the original series.
"fdiffsd": Residuals of the first differences on four seasonal dummy variables.
"perdiff": Periodic differences of the original series.
"perdiffsd": Residuals of the periodic differences on four seasonal dummy variables.
Lags at which the acf is computed, estimates of the acf, and p-values for the significance of the acf at each lag.
Javier Lopez-de-Lacalle [email protected].
acf
.
## Logarithms of the Real GNP in Germany data("gergnp") lgergnp <- log(gergnp, base=exp(1)) out <- acf.ext1(wts=lgergnp, transf.type="orig", type="correlation", lag.max=12, showcat=TRUE, plot=FALSE) out <- acf.ext1(wts=lgergnp, transf.type="perdiffsd", perdiff.coeff = c(1.004, 0.981, 1.047, 0.969), type="correlation", lag.max=12, showcat=TRUE, plot=FALSE)
## Logarithms of the Real GNP in Germany data("gergnp") lgergnp <- log(gergnp, base=exp(1)) out <- acf.ext1(wts=lgergnp, transf.type="orig", type="correlation", lag.max=12, showcat=TRUE, plot=FALSE) out <- acf.ext1(wts=lgergnp, transf.type="perdiffsd", perdiff.coeff = c(1.004, 0.981, 1.047, 0.969), type="correlation", lag.max=12, showcat=TRUE, plot=FALSE)
OECD Main Economic Indicators: Unemployment in Canada. Sample: 1960.1 - 1987.4. Remark: measured in 1000 persons. This time series is part of the data set used in the book Franses (1996).
data ("canun")
data ("canun")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
OECD Main Economic Indicators: Unemployment in Canada. Sample: 1960.1 - 1987.4. Remark: Seasonally Adjusted. This time series is part of the data set used in the book Franses (1996).
data ("canunsa")
data ("canunsa")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time canunsas (Oxford University Press, 1996).
This function fits either an autoregressive (AR) or a periodic autoregressive (PAR) model and extract the estimates for the autoregressive or periodic autoregressive coefficients.
fit.ar.par (wts, type, detcomp, p)
fit.ar.par (wts, type, detcomp, p)
wts |
a univariate time series object. |
type |
A character string indicating whether the model to fit is an autoregressive model,
|
detcomp |
deterministic components to include in the model. Three types of regressors can be included: regular deterministic components, seasonal deterministic components, and any regressor variable previously defined by the user. This argument must be a list object with the following elements:
|
p |
the lag order of the model. |
If type
is "AR"
the following model is estimated by ordinary least squares:
If type
is "PAR"
, the following model is estimated by ordinary least squares:
for , where
S
is the periodicity of the time series.
Deterministic components can be added to models above. Be careful when defining the detcomp
argument. To include an intercept and seasonal intercepts, or a regular trend with seasonal trends, will
cause multicollinearity problems.
A fit.partsm-class
class object reporting the estimates of the autoregressive or periodic
autoregressive coefficients. See fit.partsm-class
to check further information available
from this class via the methods show
and summary
.
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
fit.piartsm-class
, fit.partsm-class
, and PAR.MVrepr-methods
.
## Models for the the logarithms of the Real GNP in Germany. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) ## Fit an AR(4) model with intercept and seasonal dummies. detcomp <- list(regular=c(1,0,c(1,2,3)), seasonal=c(0,0), regvar=0) out.ar <- fit.ar.par(wts=lgergnp, type="AR", detcomp=detcomp, p=4) ## Fit a PAR(2) model with seasonal intercepts. detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out.par <- fit.ar.par(wts=lgergnp, type="PAR", detcomp=detcomp, p=2)
## Models for the the logarithms of the Real GNP in Germany. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) ## Fit an AR(4) model with intercept and seasonal dummies. detcomp <- list(regular=c(1,0,c(1,2,3)), seasonal=c(0,0), regvar=0) out.ar <- fit.ar.par(wts=lgergnp, type="AR", detcomp=detcomp, p=4) ## Fit a PAR(2) model with seasonal intercepts. detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out.par <- fit.ar.par(wts=lgergnp, type="PAR", detcomp=detcomp, p=2)
This class contains information on the autoregressive or periodic autoregressive parameters estimated by
fit.ar.par
.
type
:Object of class "character"
: The type of the fitted model, an autoregressive
model, "AR"
, or a periodic autoregressive model, "PAR"
.
p
:Object of class "numeric"
: The lag order parameter of the model.
lm.ar
:Object of class "ANY"
: The summary of a fitted AR model. When an AR type
model is selected, it is of class "lm"
, otherwise the slot is empty.
lm.par
:Object of class "ANY"
: The summary of a fitted PAR model. When a PAR type
model is selected, it is of class "lm"
, otherwise the slot is empty.
ar.coeffs
:Object of class "ANY"
: The autoregressive parameters estimates. When a
PAR type model is selected, it is of class "matrix"
, otherwise the slot is empty.
par.coeffs
:Object of class "ANY"
: The periodic autoregressive parameters
estimates. When a PAR type model is selected, it is of class "matrix"
, otherwise the slot is
empty.
show
:This method reports the autoregressive or periodic autoregressive estimates, depending whether the model is an AR model or a PAR model.
summary
:In addition to the information reported by show
, a summary of the fitted
model is also added.
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
Fit a periodically integrated periodic autoregressive model.
fit.piar (wts, detcomp, p, initvalues=NULL)
fit.piar (wts, detcomp, p, initvalues=NULL)
wts |
a univariate time series object. |
detcomp |
a vector indicating the deterministic components included in the auxiliary regression. See
the corresponding item in |
p |
the order of the PAR model. In this version first and second order are considered. |
initvalues |
by default, initial values are computed for the non-linear model. However, in this version there may be cases in which the estimates do not converge, giving an error message. In this case, a numeric vector with initial values guessed by the user can be included. |
The following equation is estimated by non-linear least squares
under the restriction for
, where
denotes
the number of seasons. Regressors defined in
detcomp
can also be included. Obviously, for a first
order PIAR process parameters are equal to zero.
An object of class fit.piartsm-class
containing the estimated coefficients in the restricted
non-linear model, the residuals, and the periodic autoregressive coefficients. On the basis of the
estimated parameters, the periodically differenced data are also computed. See
fit.piartsm-class
for methods that display this information.
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
nls
, fit.ar.par
, and fit.piartsm-class
.
## Fit a PIAR(2) model for the logarithms of the Real GNP in Germany. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2, initvalues=NULL)
## Fit a PIAR(2) model for the logarithms of the Real GNP in Germany. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2, initvalues=NULL)
This class contains information on the periodic autoregressive parameters estimated by
fit.piar
.
p
:Object of class "numeric"
: The order of the PIAR model.
nls.parameters
:Object of class "matrix"
: Estimated coefficients of the
non-linear PIAR model.
nls.res
:Object of class "numeric"
: Residuals of the non-linear PIAR model.
par.coeffs
:Object of class "matrix"
: Periodic autoregressive parameters
estimates.
pdiff.data
:Object of class "ts"
: Periodically differenced data.
show
:Reports the periodic autoregressive coefficients estimates.
summary
:Like show, the periodically differenced data are also displayed.
plot
:Plot the the periodically differenced data, as well as the seasonal paths of the transformed data.
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
Test for the significance of prospective autoregressive parameters of order in an AR(p) or
PAR(p) model. It is performed as an F-statistic that sets the parameters of order
equal to zero.
Fnextp.test (wts, detcomp, p, type)
Fnextp.test (wts, detcomp, p, type)
wts |
a univariate time series object. |
detcomp |
a vector indicating the deterministic components included in the auxiliary regression.
See the corresponding item in |
p |
the order of the initial AR or PAR model. |
type |
a character string indicating whether the model to fit is an autoregressive model,
|
An object of class Ftest.partsm-class
containing the -test statistic, the freedom
degrees an the corresponding
-value.
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
fit.ar.par
, and Ftest.partsm-class
.
## Test the significance of a second order lag in a PAR model for the Real GNP in Germany. ## Including seasonal intercepts. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out <- Fnextp.test(wts=lgergnp, detcomp=detcomp, p=1, type="PAR")
## Test the significance of a second order lag in a PAR model for the Real GNP in Germany. ## Including seasonal intercepts. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out <- Fnextp.test(wts=lgergnp, detcomp=detcomp, p=1, type="PAR")
Test for periodic variation in the autoregressive parameters.
Fpar.test (wts, detcomp, p)
Fpar.test (wts, detcomp, p)
wts |
a univariate time series object. |
detcomp |
a vector indicating the deterministic components included in the auxiliary regression. See
the corresponding item in |
p |
the order of the initial AR or PAR model. |
An F-test based on the residual sum of squares is performed to test for periodic variation in the autoregressive parameters.
On the basis of the following model,
for , where
S
is the periodicity of the time series,
the null-hypothesis is non-periodicity: , for
and
. When the null hypothesis is imposed an AR(p) is estimated, whereas the alternative is
a PAR(p) model.
The F-statistic when four seasonal intercepts are included follows an F((S-1)*p, n-(S+S*p)) distribution, where S
is the periodicity of the series and n
the number of observations.
An object of class Ftest.partsm-class
containing the -test statistic, the freedom
degrees an the corresponding
-value.
Javier Lopez-de-Lacalle [email protected].
fit.ar.par
, and Ftest.partsm-class
.
## Test for periodicity in a second order PAR model for ## the logarithms of the Real GNP in Germany time series. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out <- Fpar.test(wts=lgergnp, detcomp=detcomp, p=2)
## Test for periodicity in a second order PAR model for ## the logarithms of the Real GNP in Germany time series. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out <- Fpar.test(wts=lgergnp, detcomp=detcomp, p=2)
This function performs a test for a parameter restriction in a PAR model. Two restrictions can be considered and entail that the process contain either the unit root 1 or the seasonal unit root -1. In this version PAR models up to order 2 can be considered.
Fpari.piar.test (wts, detcomp, p, type)
Fpari.piar.test (wts, detcomp, p, type)
wts |
a univariate time series object. |
detcomp |
a vector indicating the deterministic components included in the auxiliary regression. See
the corresponding item in |
p |
the order of the initial AR or PAR model. In this version PAR models up to order 2 with seasonal intercepts are considered. |
type |
a character string indicating which restriction should be tested. |
On the basis of the following PAR model (in this version PAR models up to order 2 are considered and seasonal intercepts are included default),
for , two different hypotheses can be tested:
,
.
For S=4, if the hypothesis cannot be rejected (see
LRurpar.test), the null hypotheses above entails that either
or
.
When the first H0 is not rejected, the PAR model contains the unit root 1, and the periodic difference
filter is just the first order difference, , where
is the lag operator.
When the second H0 is not rejected, the PAR model contains the unit root -1, and the periodic difference
filter is simplified as .
In both null hypotheses it is said that the data behave as a PAR model for an integrated series, known as PARI. If those null hypotheses are rejected, the corresponding model is called a periodically integrated autoregressive model, PIAR.
The asymptotic distribution of the F-statistic is , where
is the number of
observations and
the number of regressors.
In this version PAR models up to order 2 can be considered.
An object of class Ftest.partsm-class
containing the -test statistic, the freedom
degrees an the corresponding
-value.
Javier Lopez-de-Lacalle [email protected].
Ftest.partsm-class
, and LRurpar.test
.
## Test for the unit root 1 in a PAR(2) with seasonal intercepts for ## the logarithms of the Real GNP in Germany. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out <- Fpari.piar.test(wts=lgergnp, detcomp=detcomp, p=2, type="PARI1")
## Test for the unit root 1 in a PAR(2) with seasonal intercepts for ## the logarithms of the Real GNP in Germany. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out <- Fpari.piar.test(wts=lgergnp, detcomp=detcomp, p=2, type="PARI1")
Test for seasonal heteroskedasticity.
Fsh.test (res, s)
Fsh.test (res, s)
res |
a vector containing the data to be tested. |
s |
the periodicity of the data. |
On the basis of the following model,
where S
is the periodicity of the data, the null hypothesis of
the null-hypothesis , for
is tested.
The F-statistic follows an F((S-1), n-k) distribution, where n
is the number of observations and
k
the number of parameters.
An object of class Ftest.partsm-class
containing the -test statistic, the freedom
degrees an the corresponding
-value.
Javier Lopez-de-Lacalle [email protected].
## Fsh test for the residuals of the first differences ## of the logarithms of the Real GNP in Germany ## on an AR(4) model with seasonal intercepts. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) wts <- ts(c(NA, diff(gergnp, lag=1)), frequency=4, start=start(lgergnp)) detcomp=list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) ar4 <- fit.ar.par(wts=lgergnp, type="AR", p=4, detcomp=detcomp) out <- Fsh.test(res=residuals([email protected]), s=frequency(wts))
## Fsh test for the residuals of the first differences ## of the logarithms of the Real GNP in Germany ## on an AR(4) model with seasonal intercepts. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) wts <- ts(c(NA, diff(gergnp, lag=1)), frequency=4, start=start(lgergnp)) detcomp=list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) ar4 <- fit.ar.par(wts=lgergnp, type="AR", p=4, detcomp=detcomp) out <- Fsh.test(res=residuals(ar4@lm.ar), s=frequency(wts))
This class contains the information provided by the -tests available in the package
'partsm'
.
test.label
:Object of class "character"
: A label to identify the test that the
information is related to.
test.name
:Object of class "character"
: A one-line description of the test.
p
:Object of class "numeric"
: The order of the AR or PAR model.
Fstat
:Object of class "numeric"
: The -statistic.
df
:Object of class "numeric"
: The freedom degrees.
pval
:Object of class "numeric"
: The -value.
pvl
:Object of class "character"
: A symbol indicating the significance of the
-statistic according to usual codes, i.e. Signif. codes: 0 '***' 0.001 '**' 0.01 '*'
0.05 '.' 0.1 ' ' 1.
h0md
:Object of class "lm"
: The summary of the model fitted for the null
hypothesis.
hamd
:Object of class "ANY"
: The summary of the model fitted for the
alternative hypothesis.
show
:This method reports the -test statistic, the null and the alternative
hypotheses entailed in the procedure, as well as the freedom degrees, the
-value and the
codified
-value.
summary
:In addition to the information reported by show
, a summary of the fitted
models for the null and the alternative hypotheses is also added.
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
Fnextp.test
, Fpar.test
, Fsh.test
, and
Fpari.piar.test
.
Real GNP in Germany. Sample: 1960.1 - 1990.4. This time series is part of the data set used in the book Franses (1996).
data ("gergnp")
data ("gergnp")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
J. Wolters (1992): Persistence and Seasonality in Output and Employment of the Federal Republic of Germany, Recherches Economiques de Louvain, 58 pp.421-39.
Real GNP in Germany. Sample: 1960.1 - 1990.4. Remark: Seasonally Adjusted. This time series is part of the data set used in the book Franses (1996).
data ("gergnpsa")
data ("gergnpsa")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
J. Wolters (1992): Persistence and Seasonality in Output and Employment of the Federal Republic of Germany, Recherches Economiques de Louvain, 58 pp.421-39.
This class contains the information provided by LRurpar.test
.
test.label
:Object of class "character"
: A label to identify the test.
test.name
:Object of class "character"
: A one-line description of the test.
p
:Object of class "numeric"
: The lag order parameter of the model.
LR
:Object of class "numeric"
: The LR statistic.
LRtau
:Object of class "numeric"
: The one side test statistic.
h0nls
:Object of class "matrix"
: The estimated coefficients of the non-linear PIAR
model.
halm
:Object of class "lm"
: The estimated PAR model for the alternative
hypotheses.
show
:Shows the LR statistics and a one-side test constructed as
, where
is the product of the periodic
differencing filter parameters estimated under the alternative.
summary
:Displays the same output as show
but a summary of the null and the
alternative hypotheses is also displayed.
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
This function performs the likelihood ratio test for a single unit root in a PAR(p) model up to order 2.
LRurpar.test (wts, detcomp, p)
LRurpar.test (wts, detcomp, p)
wts |
a univariate time series object. |
detcomp |
a vector indicating the deterministic components included in the auxiliary regression. See
the corresponding item in |
p |
the order of the PAR model. In this version first and second order models are considered. |
In a quarterly time series, the PAR(1) model, with
, contains a unit root if
. To test
this hypothesis, a likelihood ratio test,
LR
, is built as the logarithm of the ratio between the
residual sum of squares in the unrestricted and the restricted model, weighted by the number of
observations.
The unrestricted PAR model is estimated by OLS, whereas the model in which the null hypothesis is
imposed, i.e. , is estimated by nonlinear least squares.
The critical values are reported in Osterwald-Lenum (1992), table 1.1 (for the case where ).
In this version, PAR models up to order 2 with seasonal intercepts are considered, since the function
fit.piar
does not allow for higher orders.
An object of class LRur.partsm-class
containing the LR statistics and a one-side test
constructed as , where
is the product of
the periodic differencing filter parameters estimated under the alternative.
Javier Lopez-de-Lacalle [email protected].
H.P. Boswijk and P.H. Franses (1996), Unit roots in periodic autoregressions. Journal of Time series Analysis, 17, pp. 221-245.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
Osterwald-Lenum, M. (1992), A Note with Quantiles of the Asymptotic Distribution of the Maximum Likelihood Cointegration Rank Test Statistics: Four Cases. Oxford Bulletin of Economics and Statistics, 54, pp.461-472.
fit.ar.par
, fit.piar
, and LRur.partsm-class
.
## Test for a single unit root in a PAR(2) model with seasonal intercepts for the ## logarithms of the Real GNP in Germany. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out <- LRurpar.test(wts=lgergnp, detcomp=detcomp, p=2)
## Test for a single unit root in a PAR(2) model with seasonal intercepts for the ## logarithms of the Real GNP in Germany. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out <- LRurpar.test(wts=lgergnp, detcomp=detcomp, p=2)
This class contains the matrices for the multivariate representation of an object of
class fit.partsm-class
.
Phi0
:Object of class "matrix"
: Matrix for the multivariate representation. See
details in PAR.MVrepr-methods
.
Phi1
:Object of class "matrix"
: Matrix for the multivariate representation. See
details in PAR.MVrepr-methods
.
Gamma.eigenvalues
:Object of class "numeric"
: Eigenvalues of the matrix
.
tvias
:Object of class "matrix"
: Time-varying impact of accumulation of shocks
calculated as .
signature(object = "MVPAR")
: Shows the information contained in the slots.
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
PAR.MVrepr-methods
, and fit.partsm-class
.
This class contains the matrices for the multivariate representation of an object of
class fit.piartsm-class
.
Phi0
:Object of class "matrix"
: Matrix for the multivariate representation. See
details in PAR.MVrepr-methods
.
Phi1
:Object of class "matrix"
: Matrix for the multivariate representation. See
details in PAR.MVrepr-methods
.
Gamma.eigenvalues
:Object of class "numeric"
: Eigenvalues of the matrix
.
tvias
:Object of class "matrix"
: Time-varying impact of accumulation of shocks
calculated as .
Omega0
:Object of class "ANY"
: Matrix for internal use.
Omega1
:Object of class "ANY"
: Matrix for internal use.
Pi0
:Object of class "ANY"
: Matrix for internal use.
Pi1
:Object of class "ANY"
: Matrix for internal use.
signature(object = "MVPIAR")
: Shows the information contained in the slots.
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
PAR.MVrepr-methods
, and fit.piartsm-class
.
The function PAR.MVrepr
applied on the out.par
object of class fit.partsm
, shows
the multivariate representation as well as some complementary information of a PAR process.
PAR.MVrepr(object)
PAR.MVrepr(object)
object |
An object of class |
For more information, see the vignette, section 2.
A list with different objects
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
## Models for the the logarithms of the Real GNP in Germany. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) ## Fit an PAR model detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out.par <- fit.ar.par(wts=lgergnp, type="PAR", detcomp=detcomp, p=2) ## Show the matrix representation: out.MV <- PAR.MVrepr(out.par) out.MV
## Models for the the logarithms of the Real GNP in Germany. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) ## Fit an PAR model detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out.par <- fit.ar.par(wts=lgergnp, type="PAR", detcomp=detcomp, p=2) ## Show the matrix representation: out.MV <- PAR.MVrepr(out.par) out.MV
This method provides the relevant matrices for the multivariate representation of a PAR or PIAR model
fitted by the functions fit.ar.par
, and fit.piar
.
In a quarterly time series, the periodic autoregressive model of order less or equal to 4,
with , can be written as a multivariate model as follows,
where and
are
matrices containing the
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
The periodically integrated model of order 2,
with , can be written as a multivariate model as follows,
where the matrix and
are defined below
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
The and
matrices can be used to compute the impact of accumulation of the
shocks
. The impact matrix is defined as
, where
is
.
That row in which the values of the impact matrix are the highest, entails that the corresponding season undergoes more severe impacts from the accumulation of all shocks. Hence, it is more likely to display fluctuations in the stochastic trend. Put in other words, the impact matrix allow the practitioner to get an idea about how the stochastic trend and the seasonal fluctuations are related.
Provides a list object containing the estimated matrices ,
, the eigen values of
, and the time-varying impact of accumulation
of shocks calculated as
. See details below.
Provides the same list as in the latter case. See details below.
Javier Lopez-de-Lacalle [email protected].
fit.partsm-class
, and fit.piartsm-class
.
## Load data and select the deterministic components. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) ## Multivariate representation of a PAR(2) model with sesonal intercepts. out.par <- fit.ar.par(wts=lgergnp, type="PAR", detcomp=detcomp, p=2) PAR.MVrepr(out.par) ## Multivariate representation of a PIAR(2) model with sesonal intercepts. out.piar <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2) PAR.MVrepr(out.piar)
## Load data and select the deterministic components. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) ## Multivariate representation of a PAR(2) model with sesonal intercepts. out.par <- fit.ar.par(wts=lgergnp, type="PAR", detcomp=detcomp, p=2) PAR.MVrepr(out.par) ## Multivariate representation of a PIAR(2) model with sesonal intercepts. out.piar <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2) PAR.MVrepr(out.piar)
On the basis of the estimated parameters in a PIAR model, this function displays the periodically differenced data, as well as two different representations of the seasonal paths for the transformed data.
plotpdiff (x)
plotpdiff (x)
x |
Object of class 'fir.piartsm'. |
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
fit.piartsm-class
, and fit.piar
.
## Load data and select the deterministic components. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) ## Fit a PIAR(2) model with seasonal intercepts. out.piar <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2) plotpdiff(out.piar)
## Load data and select the deterministic components. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) ## Fit a PIAR(2) model with seasonal intercepts. out.piar <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2) plotpdiff(out.piar)
This function displays a plot of the predictions and the corresponding 95 per cent confidence intervals based on a PIAR model. In this version, this function is implemented for quarterly observed data, PIAR models up to order 2 are considered, and seasonal intercepts are included by default.
plotpredpiar (x)
plotpredpiar (x)
x |
Object of class 'pred.piartsm'. |
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
pred.piartsm-class
, and predictpiar
.
## Load data and select the deterministic components. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) ## Fit a PIAR(2) model with seasonal intercepts. out.pred <- predictpiar(wts=lgergnp, p=2, hpred=24) plotpredpiar(out.pred)
## Load data and select the deterministic components. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) ## Fit a PIAR(2) model with seasonal intercepts. out.pred <- predictpiar(wts=lgergnp, p=2, hpred=24) plotpredpiar(out.pred)
This class contains the information provided by predictpiar
.
wts
:Object of class "wts"
: The observed time series.
hpred
:Object of class "numeric"
: The number of forecasts.
p
:Object of class "numeric"
: The lag order parameter of the PIAR model.
fcast
:Object of class "ts"
: The out-of-sample forecasts.
fse
:Object of class "ts"
: The forecast standard errors.
ucb
:Object of class "ts"
: The upper 95 per cent confidence bound.
lcb
:Object of class "ts"
: The lower 95 per cent confidence bound.
show
:Shows out-of-sample forecasts and the corresponding standard errors, as well as the 95 per cent confidence intervals.
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
This function performs predictions for a restricted periodic autoregressive model. This version considers PIAR models up to order 2 with seasonal intercepts. It is implemented for quarterly observed data.
predictpiar (wts, p, hpred)
predictpiar (wts, p, hpred)
wts |
a univariate time series object. |
p |
the order of the PAR model. At present first and second order are considered. |
hpred |
number of out-of-sample observations to forecast. It must be a multiple of 4. |
Upon the multivariate representation,
where the are
matrices containing the
, the one-step-ahead forecasts for the year
is straightforward,
Multi-step-ahead forecasts are obtained recursively.
The prediction errors variances for the one-step-ahead forecast are the diagonal elements of
whereas for years ahead forecasts it becomes
where .
This version considers PIAR models up to order 2 for quarterly observed data. By default, seasonal intercepts are included in the model as deterministic components.
The number of observations to forecast, hpred
must be a multiple of 4.
An object of class pred.piartsm-class
containing the forecasts and the corresponding
standard errors, as well as the 95 per cent confidence intervals.
Javier Lopez-de-Lacalle [email protected].
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
fit.piar
, PAR.MVrepr-methods
, and pred.piartsm-class
.
## 24 step-ahead forecasts in a PIAR(2) model for the ## logarithms of the Real GNP in Germany. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) pred.out <- predictpiar(wts=lgergnp, p=2, hpred=24)
## 24 step-ahead forecasts in a PIAR(2) model for the ## logarithms of the Real GNP in Germany. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) pred.out <- predictpiar(wts=lgergnp, p=2, hpred=24)
This method shows the information provided by functions implemented in package 'partsm'.
Shows the estimates of the autoregressive or periodic autoregressive coefficients.
Shows the -test statistic, the null and the alternative
hypotheses entailed in the procedure, as well as the freedom degrees, the
-value and a symbol
indicating the significance of the
-statistic according to usual codes, i.e. Signif.
codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1.
Shows the estimated periodic autoregressive coefficients in the restricted non-linear PIAR.
Shows the LR statistics and a one-side test constructed as
, where
is the product of the periodic
differencing filter parameters estimated under the alternative.
Shows out-of-sample forecasts and the corresponding standard errors, as well as the 95 per cent confidence intervals.
Javier Lopez-de-Lacalle [email protected].
fit.partsm-class
, Ftest.partsm-class
, and summary
.
## Load data and select the deterministic components. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) ## Fit an AR(4) model with intercept and seasonal dummies. dcar <- list(regular=c(1,0,c(1,2,3)), seasonal=c(0,0), regvar=0) out.ar <- fit.ar.par(wts=lgergnp, type="AR", detcomp=dcar, p=4) show(out.ar) ## Fit a PAR(2) model with seasonal intercepts. out.par <- fit.ar.par(wts=lgergnp, type="PAR", detcomp=detcomp, p=2) show(out.par) ## Fnextp.test Fnextp.out <- Fnextp.test(wts=lgergnp, detcomp=detcomp, p=1, type="PAR") show(Fnextp.out) ## Fpar.test Fpar.out <- Fpar.test(wts=lgergnp, detcomp=detcomp, p=2) show(Fpar.out) ## Fsh.test ar4 <- fit.ar.par(wts=lgergnp, type="AR", p=4, detcomp=detcomp) Fsh.out <- Fsh.test(res=residuals([email protected]), s=frequency(lgergnp)) show(Fsh.out) ## Fit a PIAR(2) model with seasonal intercepts. out.piar <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2) show(out.piar) ## Fpari.piar.test Fpari1.out <- Fpari.piar.test(wts=lgergnp, detcomp=detcomp, p=2, type="PARI1") show(Fpari1.out) ## Fit a PIAR(2) model with seasonal intercepts. out.piar <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2) show(out.piar) ## Test for a single unit root in a PAR(2) model with seasonal intercepts. out.LR <- LRurpar.test(wts=lgergnp, detcomp=detcomp, p=2) show(out.LR) ## 24 step-ahead forecasts in a PIAR(2) model. pred.out <- predictpiar(wts=lgergnp, p=2, hpred=24) show(pred.out)
## Load data and select the deterministic components. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) ## Fit an AR(4) model with intercept and seasonal dummies. dcar <- list(regular=c(1,0,c(1,2,3)), seasonal=c(0,0), regvar=0) out.ar <- fit.ar.par(wts=lgergnp, type="AR", detcomp=dcar, p=4) show(out.ar) ## Fit a PAR(2) model with seasonal intercepts. out.par <- fit.ar.par(wts=lgergnp, type="PAR", detcomp=detcomp, p=2) show(out.par) ## Fnextp.test Fnextp.out <- Fnextp.test(wts=lgergnp, detcomp=detcomp, p=1, type="PAR") show(Fnextp.out) ## Fpar.test Fpar.out <- Fpar.test(wts=lgergnp, detcomp=detcomp, p=2) show(Fpar.out) ## Fsh.test ar4 <- fit.ar.par(wts=lgergnp, type="AR", p=4, detcomp=detcomp) Fsh.out <- Fsh.test(res=residuals(ar4@lm.ar), s=frequency(lgergnp)) show(Fsh.out) ## Fit a PIAR(2) model with seasonal intercepts. out.piar <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2) show(out.piar) ## Fpari.piar.test Fpari1.out <- Fpari.piar.test(wts=lgergnp, detcomp=detcomp, p=2, type="PARI1") show(Fpari1.out) ## Fit a PIAR(2) model with seasonal intercepts. out.piar <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2) show(out.piar) ## Test for a single unit root in a PAR(2) model with seasonal intercepts. out.LR <- LRurpar.test(wts=lgergnp, detcomp=detcomp, p=2) show(out.LR) ## 24 step-ahead forecasts in a PIAR(2) model. pred.out <- predictpiar(wts=lgergnp, p=2, hpred=24) show(pred.out)
This method summarises the information provided by functions implemented in package 'partsm'.
Displays the estimates of the autoregressive or periodic autoregressive coefficients, and a summary of the fitted model is also added.
Shows a summary of the information provided by the -test
statistics in package 'partsm'. The null and the alternative hypotheses entailed in the procedure, as
well as the freedom degrees, the
-value and a symbol indicating the significance of the
-statistic according to usual codes, i.e. Signif. codes: 0 '***' 0.001 '**' 0.01 '*'
0.05 '.' 0.1 ' ' 1.
In addition, a summary of the fitted models for the null and the alternative hypotheses is also added.
Displays the estimated periodic autoregressive coefficients in the restricted non-linear PIAR, the other coefficients entailed in the selected model, and the periodically differenced data.
Reports the the LR statistics and a one-side test, and a summary of the fitted models under the null and the alternative hypotheses.
Javier Lopez-de-Lacalle [email protected].
fit.partsm-class
, Ftest.partsm-class
, and show
.
## Load data and select the deterministic components. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) ## Fit an AR(4) model with intercept and seasonal dummies. dcar <- list(regular=c(1,0,c(1,2,3)), seasonal=c(0,0), regvar=0) out.ar <- fit.ar.par(wts=lgergnp, type="AR", detcomp=dcar, p=4) summary(out.ar) ## Fit a PAR(2) model with seasonal intercepts. detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out.par <- fit.ar.par(wts=lgergnp, type="PAR", detcomp=detcomp, p=2) summary(out.par) ## Fnextp.test Fnextp.out <- Fnextp.test(wts=lgergnp, detcomp=detcomp, p=1, type="PAR") summary(Fnextp.out) ## Fpar.test Fpar.out <- Fpar.test(wts=lgergnp, detcomp=detcomp, p=2) summary(Fpar.out) ## Fsh.test ar4 <- fit.ar.par(wts=lgergnp, type="AR", p=4, detcomp=detcomp) Fsh.out <- Fsh.test(res=residuals([email protected]), s=frequency(lgergnp)) summary(Fsh.out) ## Fit a PIAR(2) model. out.piar <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2) summary(out.piar) ## Fpari.piar.test Fpari1.out <- Fpari.piar.test(wts=lgergnp, detcomp=detcomp, p=2, type="PARI1") summary(Fpari1.out) ## Fit a PIAR(2) model with seasonal intercepts. out.piar <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2) summary(out.piar) ## Test for a single unit root in a PAR(2) model with seasonal intercepts. out.LR <- LRurpar.test(wts=lgergnp, detcomp=detcomp, p=2) summary(out.LR)
## Load data and select the deterministic components. data("gergnp") lgergnp <- log(gergnp, base=exp(1)) detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) ## Fit an AR(4) model with intercept and seasonal dummies. dcar <- list(regular=c(1,0,c(1,2,3)), seasonal=c(0,0), regvar=0) out.ar <- fit.ar.par(wts=lgergnp, type="AR", detcomp=dcar, p=4) summary(out.ar) ## Fit a PAR(2) model with seasonal intercepts. detcomp <- list(regular=c(0,0,0), seasonal=c(1,0), regvar=0) out.par <- fit.ar.par(wts=lgergnp, type="PAR", detcomp=detcomp, p=2) summary(out.par) ## Fnextp.test Fnextp.out <- Fnextp.test(wts=lgergnp, detcomp=detcomp, p=1, type="PAR") summary(Fnextp.out) ## Fpar.test Fpar.out <- Fpar.test(wts=lgergnp, detcomp=detcomp, p=2) summary(Fpar.out) ## Fsh.test ar4 <- fit.ar.par(wts=lgergnp, type="AR", p=4, detcomp=detcomp) Fsh.out <- Fsh.test(res=residuals(ar4@lm.ar), s=frequency(lgergnp)) summary(Fsh.out) ## Fit a PIAR(2) model. out.piar <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2) summary(out.piar) ## Fpari.piar.test Fpari1.out <- Fpari.piar.test(wts=lgergnp, detcomp=detcomp, p=2, type="PARI1") summary(Fpari1.out) ## Fit a PIAR(2) model with seasonal intercepts. out.piar <- fit.piar(wts=lgergnp, detcomp=detcomp, p=2) summary(out.piar) ## Test for a single unit root in a PAR(2) model with seasonal intercepts. out.LR <- LRurpar.test(wts=lgergnp, detcomp=detcomp, p=2) summary(out.LR)
Real per capita disposable income in Sweden. Sample: 1963.1 - 1988.1. Remark: measured in logs. This time series is part of the data set used in the book Franses (1996).
data ("swdipc")
data ("swdipc")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
B. Assarson (1991): 'The Stochastic Behaviour of Durables and Nondurables Consumption in Sweden', Working paper 1991:21, Department of Economics, Uppsala University.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
Real per capita non-durables consumption in Sweden. Sample: 1963.1 - 1988.1. Remark: measured in logs. This time series is part of the data set used in the book Franses (1996).
data ("swndcpc")
data ("swndcpc")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
B. Assarson (1991): 'The Stochastic Behaviour of Durables and Nondurables Consumption in Sweden', Working paper 1991:21, Department of Economics, Uppsala University.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
United Kingdom total consumption. Sample: 1955.1 - 1988.4. Remark: at 1985 prices. This time series is part of the data set used in the book Franses (1996).
data ("ukcons")
data ("ukcons")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
D.R. Osborn (1990): A Survey of Seasonality in UK Macroeconomic Variables, International Journal of Forecasting, 6, pp. 327-36.
United Kindom exports of goods and services. Sample: 1955.1 - 1988.4. Remark: at 1985 prices. This time series is part of the data set used in the book Franses (1996).
data ("ukexp")
data ("ukexp")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
D.R. Osborn (1990): A Survey of Seasonality in UK Macroeconomic Variables, International Journal of Forecasting, 6, pp. 327-36.
United Kingdom gross domestic product. Sample: 1955.1 - 1988.4. Remark: at 1985 prices. This time series is part of the data set used in the book Franses (1996).
data ("ukgdp")
data ("ukgdp")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
D.R. Osborn (1990): A Survey of Seasonality in UK Macroeconomic Variables, International Journal of Forecasting, 6, pp. 327-36.
United Kindom imports of goods and services. Sample: 1955.1 - 1988.4. Remark: at 1985 prices. This time series is part of the data set used in the book Franses (1996).
data ("ukimp")
data ("ukimp")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
D.R. Osborn (1990): A Survey of Seasonality in UK Macroeconomic Variables, International Journal of Forecasting, 6, pp. 327-36.
Real total investment in the United Kindom. Sample: 1955.1 - 1988.4. This time series is part of the data set used in the book Franses (1996).
data ("ukinvest")
data ("ukinvest")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
D.R. Osborn (1990): A Survey of Seasonality in UK Macroeconomic Variables, International Journal of Forecasting, 6, pp. 327-36.
United Kindom nondurables consumption. Sample: 1955.1 - 1988.4. Remark: at 1985 prices. This time series is part of the data set used in the book Franses (1996).
data ("ukndcons")
data ("ukndcons")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
D.R. Osborn (1990): A Survey of Seasonality in UK Macroeconomic Variables, International Journal of Forecasting, 6, pp. 327-36.
United Kindom public investment. Sample: 1962.1 - 1988.4. Remark: at 1985 prices. This time series is part of the data set used in the book Franses (1996).
data ("ukpinvest")
data ("ukpinvest")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
D.R. Osborn (1990): A Survey of Seasonality in UK Macroeconomic Variables, International Journal of Forecasting, 6, pp. 327-36.
United Kindom workforce. Sample: 1955.1 - 1988.4. Remark: Consisting of workforce in employment and unemployment. This time series is part of the data set used in the book Franses (1996).
data ("ukwf")
data ("ukwf")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
D.R. Osborn (1990): A Survey of Seasonality in UK Macroeconomic Variables, International Journal of Forecasting, 6, pp. 327-36.
OECD Main Economic Indicators: Total industrial production index for the United States. Sample: 1960.1 - 1991.4. Remark: (1985=100). This time series is part of the data set used in the book Franses (1996).
data ("usaipi")
data ("usaipi")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).
OECD Main Economic Indicators: Total industrial production index for the United States. Sample: 1960.1 - 1991.4. Remark: (1985=100), Seasonally Adjusted. This time series is part of the data set used in the book Franses (1996).
data ("usaipisa")
data ("usaipisa")
An object of class 'ts' containing the data.
Previously available on P.H. Franses's homepage: https://www.eur.nl/en/people/philip-hans-franses.
P.H. Franses: Periodicity and Stochastic Trends in Economic Time Series (Oxford University Press, 1996).