拟合时变系数 DLM

机器算法验证 r 回归 时间序列 dlm 动态回归
2022-03-13 06:42:55

我想用时变系数拟合 DLM,即对通常的线性回归的扩展,

yt=θ1+θ2x2

我有一个预测变量 ( ) 和一个响应变量 ( ),分别是 1950 年至 2011 年的海洋和内陆年度鱼类捕获量。我希望遵循 DLM 回归模型,x2yt

yt=θt,1+θt,2xt

其中系统演化方程为

θt=Gtθt1

来自 Petris 等人的 Dynamic Linear Models With R 的第 43 页。

这里有一些编码,

fishdata <- read.csv("http://dl.dropbox.com/s/4w0utkqdhqribl4/fishdata.csv", header=T)
x <- fishdata$marinefao
    y <- fishdata$inlandfao

lmodel <- lm(y ~ x)
summary(lmodel)
plot(x, y)
abline(lmodel)

显然回归模型的时变系数在这里更合适。我从第 121 页到第 125 页遵循他的示例,并希望将其应用于我自己的数据。这是示例中的编码

############ PAGE 123
require(dlm)

capm <- read.table("http://shazam.econ.ubc.ca/intro/P.txt", header=T)
capm.ts <- ts(capm, start = c(1978, 1), frequency = 12)
colnames(capm)
plot(capm.ts)
IBM <- capm.ts[, "IBM"]  - capm.ts[, "RKFREE"]
x <- capm.ts[, "MARKET"] - capm.ts[, "RKFREE"]
x
plot(x)
outLM <- lm(IBM ~ x)
outLM$coef
    acf(outLM$res)
qqnorm(outLM$res)
    sig <- var(outLM$res)
sig

mod <- dlmModReg(x,dV = sig, m0 = c(0, 1.5), C0 = diag(c(1e+07, 1)))
outF <- dlmFilter(IBM, mod)
outF$m
    plot(outF$m)
outF$m[ 1 + length(IBM), ]

########## PAGES 124-125
buildCapm <- function(u){
  dlmModReg(x, dV = exp(u[1]), dW = exp(u[2:3]))
}

outMLE <- dlmMLE(IBM, parm = rep(0,3), buildCapm)
exp(outMLE$par)
    outMLE
    outMLE$value
mod <- buildCapm(outMLE$par)
    outS <- dlmSmooth(IBM, mod)
    plot(dropFirst(outS$s))
outS$s

我希望能够plot(dropFirst(outS$s))为我自己的数据绘制平滑估计,但我在执行时遇到了麻烦。

更新

我现在可以制作这些图,但我认为它们不正确。

fishdata <- read.csv("http://dl.dropbox.com/s/4w0utkqdhqribl4/fishdata.csv", header=T)
x <- as.numeric(fishdata$marinefao)
    y <- as.numeric(fishdata$inlandfao)
xts <- ts(x, start=c(1950,1), frequency=1)
xts
yts <- ts(y, start=c(1950,1), frequency=1)
yts

lmodel <- lm(yts ~ xts)
#################################################
require(dlm)
    buildCapm <- function(u){
  dlmModReg(xts, dV = exp(u[1]), dW = exp(u[2:3]))
}

outMLE <- dlmMLE(yts, parm = rep(0,3), buildCapm)
exp(outMLE$par)
        outMLE$value
mod <- buildCapm(outMLE$par)
        outS <- dlmSmooth(yts, mod)
        plot(dropFirst(outS$s))

> summary(outS$s); lmodel$coef
       V1              V2       
 Min.   :87.67   Min.   :1.445  
 1st Qu.:87.67   1st Qu.:1.924  
 Median :87.67   Median :3.803  
 Mean   :87.67   Mean   :4.084  
 3rd Qu.:87.67   3rd Qu.:6.244  
 Max.   :87.67   Max.   :7.853  
 (Intercept)          xts 
273858.30308      1.22505 

截距平滑估计 (V1) 与 lm 回归系数相差甚远。我认为他们应该彼此更接近。

1个回答

你的问题到底是什么?

我发现的唯一陷阱是,显然,

fishdata <- read.csv("http://dl.dropbox.com/s/4w0utkqdhqribl4,
                     fishdata.csv", header=T)

以整数形式读取数据。我不得不将它们转换为浮动,

x <- as.numeric(fishdata$marinefao)
y <- as.numeric(fishdata$inlandfao)

在我可以调用 dlm* 函数之前。