полная модель PLAT в пакете смертности StMoMo - PullRequest
0 голосов
/ 27 февраля 2020

Я использую пакет R StMoMo для создания Stochasti c Моделирование смертности. Документ с обозначениями можно найти здесь: https://openaccess.city.ac.uk/id/eprint/17378/7/StMoMoVignette.pdf

В документе описана полная модель PLAT:

enter image description here

И уменьшенная модель PLAT:

enter image description here

Затем он предоставляет (см. P13-14) код для уменьшенной модели PLAT. Этот код работает нормально.

#to get data
ages.fit = 12:84
years.fit = 2008:2017
gender = "male"
JPNdata = hmd.mx(country="JPN",username=username,password=password,label="Japan")
JPNStMoMo = StMoMoData(JPNdata, series = gender,type="initial")

#the reduced Plat model
f2 <- function(x, ages) mean(ages) - x
constPlat <- function(ax, bx, kt, b0x, gc, wxt, ages){
nYears <- dim(wxt)[2]
x <- ages
t <- 1:nYears
c <- (1 - tail(ages, 1)):(nYears - ages[1])
xbar <- mean(x)
phiReg <- lm(gc ~ 1 + c + I(c ^ 2), na.action = na.omit)
phi <- coef(phiReg)
gc <- gc - phi[1] - phi[2] * c - phi[3] * c ^ 2
kt[2, ] <- kt[2, ] + 2 * phi[3] * t
kt[1, ] <- kt[1, ] + phi[2] * t + phi[3] * (t ^ 2 - 2 * xbar * t)
ax <- ax + phi[1] - phi[2] * x + phi[3] * x ^ 2
ci <- rowMeans(kt, na.rm = TRUE)
ax <- ax + ci[1] + ci[2] * (xbar - x)
kt[1, ] <- kt[1, ] - ci[1]
kt[2, ] <- kt[2, ] - ci[2]
list(ax = ax, bx = bx, kt = kt, b0x = b0x, gc = gc)
}
reducedPlat <- StMoMo(link = "logit", staticAgeFun = TRUE,
periodAgeFun = c("1", f2), cohortAgeFun = "1", constFun = constPlat)
reducedPlat %>% fit(data=JPNStMoMo,ages.fit = ages.fit,years.fit=years.fit)

Однако я получаю следующую ошибку, когда пытаюсь немного изменить код, чтобы получить полную модель Plat:

The parameter transformation function does not preserve the fitted rates.
Check the 'constFun' argument of StMoMo."

Вот измененный код :

f2 <- function(x, ages) mean(ages) - x
f3 <- function(x, ages) max(f2(x,ages),0) #added
constPlat <- function(ax, bx, kt, b0x, gc, wxt, ages){
nYears <- dim(wxt)[2]
x <- ages
t <- 1:nYears
c <- (1 - tail(ages, 1)):(nYears - ages[1])
xbar <- mean(x)
phiReg <- lm(gc ~ 1 + c + I(c ^ 2), na.action = na.omit)
phi <- coef(phiReg)
gc <- gc - phi[1] - phi[2] * c - phi[3] * c ^ 2
kt[2, ] <- kt[2, ] + 2 * phi[3] * t
kt[1, ] <- kt[1, ] + phi[2] * t + phi[3] * (t ^ 2 - 2 * xbar * t)
ax <- ax + phi[1] - phi[2] * x + phi[3] * x ^ 2
ci <- rowMeans(kt, na.rm = TRUE)
ax <- ax + ci[1] + ci[2] * (xbar - x) + ci[3] * max(xbar - x,0)  #modified
kt[1, ] <- kt[1, ] - ci[1]
kt[2, ] <- kt[2, ] - ci[2]
kt[3, ] <- kt[3, ] - ci[3]  #added
list(ax = ax, bx = bx, kt = kt, b0x = b0x, gc = gc)
}
fullPlat <- StMoMo(link = "logit", staticAgeFun = TRUE,
periodAgeFun = c("1", f2, f3), cohortAgeFun = "1", constFun = constPlat) #modified
fullPlat %>% fit(data=JPNStMoMo,ages.fit = ages.fit,years.fit=years.fit) 

Хотя мои изменения действительно небольшие, я не замечаю своей ошибки. Заранее спасибо, если кто-то что-то заметит!

1 Ответ

0 голосов
/ 28 февраля 2020

В моем коде max нужно было изменить на pmax. Кроме того, автор пакета предоставил этот код для полной модели:

library(StMoMo)
f2 <- function(x, ages) mean(ages) - x
f3 <- function(x, ages) pmax(mean(ages)-x,0)
constPlat <- function(ax, bx, kt, b0x, gc, wxt, ages){
  nYears <- dim(wxt)[2]
  x <- ages
  t <- 1:nYears
  c <- (1 - tail(ages, 1)):(nYears - ages[1])
  xbar <- mean(x)
  #\sum g(c)=0, \sum cg(c)=0, \sum c^2g(c)=0
  phiReg <- lm(gc ~ 1 + c + I(c^2), na.action = na.omit)
  phi <- coef(phiReg)
  gc <- gc - phi[1] - phi[2] * c - phi[3] * c^2
  kt[2, ] <- kt[2, ] + 2 * phi[3] * t
  kt[1, ] <- kt[1, ] + phi[2] * t + phi[3] * (t^2 - 2 * xbar * t)
  ax <- ax + phi[1] - phi[2] * x + phi[3] * x^2
  #\sum kt[i, ] = 0
  ci <- rowMeans(kt, na.rm = TRUE)
  ax <- ax + ci[1] + ci[2] * (xbar - x) + ci[3] * pmax(xbar - x, 0)
  kt[1, ] <- kt[1, ] - ci[1]
  kt[2, ] <- kt[2, ] - ci[2]
  kt[3, ] <- kt[3, ] - ci[3]
  list(ax = ax, bx = bx, kt = kt, b0x = b0x, gc = gc)
}
PLAT <- StMoMo(link = "log", staticAgeFun = TRUE,
               periodAgeFun = c("1", f2, f3), cohortAgeFun = "1",
               constFun = constPlat)

ages.fit <- 0:100
wxt <- genWeightMat(ages = ages.fit, years = EWMaleData$years, clip = 3)

PLATfit <- fit(PLAT, data = EWMaleData, ages.fit = ages.fit, wxt = wxt)
plot(PLATfit, parametricbx = FALSE)

ссылка: https://github.com/amvillegas/StMoMo/issues/27

...