我想找出在mgcv包(x, y)
中绘图时使用的值。有谁知道我如何提取或计算这些值?plot(b, seWithMean=TRUE)
这是一个例子:
library(mgcv)
set.seed(0)
dat <- gamSim(1, n=400, dist="normal", scale=2)
b <- gam(y~s(x0), data=dat)
plot(b, seWithMean=TRUE)
我想找出在mgcv包(x, y)
中绘图时使用的值。有谁知道我如何提取或计算这些值?plot(b, seWithMean=TRUE)
这是一个例子:
library(mgcv)
set.seed(0)
dat <- gamSim(1, n=400, dist="normal", scale=2)
b <- gam(y~s(x0), data=dat)
plot(b, seWithMean=TRUE)
从mgcv
1.8-6 开始,plot.gam
无形地返回它用来生成绘图的数据,即做
pd <- plot(<some gam() model>)
给你一个列表,其中包含绘图数据pd
。
mgcv
<= 1.8-5 的答案如下:
我一再诅咒这样一个事实,即绘图函数mgcv
不返回他们正在绘制的东西——接下来的内容很丑陋,但它确实有效:
library(mgcv)
set.seed(0)
dat <- gamSim(1, n = 400, dist = "normal", scale = 2)
b <- gam(y ~ s(x0) + s(x1) + s(x2) + s(x3), data = dat)
plotData <- list()
trace(mgcv:::plot.gam, at = list(c(27, 1)),
## tested for mgcv_1.8-4. other versions may need different at-argument.
quote({
message("ooh, so dirty -- assigning into globalenv()'s plotData...")
plotData <<- pd
}))
mgcv::plot.gam(b, seWithMean = TRUE, pages = 1)
par(mfrow = c(2, 2))
for (i in 1:4) {
plot(plotData[[i]]$x, plotData[[i]]$fit, type = "l", xlim = plotData[[i]]$xlim,
ylim = range(plotData[[i]]$fit + plotData[[i]]$se, plotData[[i]]$fit -
plotData[[i]]$se))
matlines(plotData[[i]]$x, cbind(plotData[[i]]$fit + plotData[[i]]$se,
plotData[[i]]$fit - plotData[[i]]$se), lty = 2, col = 1)
rug(plotData[[i]]$raw)
}
包visreg
可以制作类似于 GAM 的效果图(但可能不完全相同?),并且确实将绘图组件作为输出,格式化为列表。使用 plyr one 可以制作输出的数据框。例子:
plot <- visreg(model, type = "contrast")
smooths <- ldply(plot, function(part)
data.frame(x=part$x$xx, smooth=part$y$fit, lower=part$y$lwr, upper=part$y$upr))
这将不是一个完整的答案。对象的所有绘图gam
都是使用 function 完成的plot.gam
。您只需键入即可查看其代码
> plot.gam
在 R 控制台中。如您所见,代码非常庞大。我从中收集到的是,所有的绘图都是通过收集对象中的相关信息来完成的,pd
对象是一个列表。因此,一种可能的解决方案是编辑,例如,plot.gam
使用它返回该对象。edit
在最后添加pd
之前}
就足够了。我建议添加invisible(pd)
,以便仅在您要求时才返回此对象:
> pd <- plot(b,seWithMean = TRUE)
然后检查此对象并在代码中搜索plot.gam
带有plot
和的行lines
。然后您将看到图中出现了哪些相关值x
和y
值。
## And this is the code for multiple variables!
require(mgcv)
n = 100
N = n
tt = 1:n
arfun = c(rep(.7,round(n/3)),rep(.3,round(n/3)),rep(-.3,ceiling(n/3)))
arfun2 = c(rep(.8,round(n/3)),rep(.3,round(n/3)),rep(-.3,ceiling(n/3)))
int = .1*(tt-mean(tt))/max(tt)-.1*((tt-mean(tt))/(max(tt)/10))^2
y = rep(NA,n)
s.sample <- N
x <- 10*rnorm(s.sample)
z <- 10*rnorm(s.sample)
for(j in 1:n){
y[j]=int[j]+x[j]*arfun[j]+z[j]*arfun2[j]+rnorm(1)
}
mod = gam(y ~ s(tt) + s(tt, by=x) + s(tt, by=z))
## getting the data out of the plot
plotData <- list()
trace(mgcv:::plot.gam, at=list(c(25,3,3,3)),
# this gets you to the location where plot.gam calls
# plot.mgcv.smooth (see ?trace)
# plot.mgcv.smooth is the function that does the actual plotting and
# we simply assign its main argument into the global workspace
# so we can work with it later.....
quote({
# browser()
print(pd)
plotData <<- c(plotData, pd)
}))
# test:
mgcv::plot.gam(mod, seWithMean=TRUE)
# see if it succeeded
slct = 3
plot(plotData[[slct]]$x, plotData[[slct]]$fit, type="l", xlim=plotData$xlim,
ylim=range(plotData[[slct]]$fit + plotData[[slct]]$se, plotData[[slct]]$fit -
plotData[[slct]]$se))
matlines(plotData[[slct]]$x,
cbind(plotData[[slct]]$fit + plotData[[slct]]$se,
plotData[[slct]]$fit - plotData[[slct]]$se), lty=2, col=1)
rug(plotData[[slct]]$raw)