如何拟合每个数据子集并绘制其拟合曲线?

时间:2015-09-07 01:15:55

标签: r ggplot2 nls

实际上,在我问这里并做了很多搜索之前我做了很多事情,但到目前为止找不到解决方案。

我有一个数据子集,我需要适合每个子集。另一方面,当我尝试绘制每个子集的回归线时,图中仅显示一条回归线。这是迄今为止的主要问题。

无论如何让我们一步一步走; 这是一个data.frame

   xx <- rep(rep(seq(0,800,200),each=10),times=2)
   yy<-c(replicate(2,sort(10^runif(10,-1,0),decreasing=TRUE)),replicate(2,sort(10^runif(10,-1,0),decreasing=TRUE)), replicate(2,sort(10^runif(10,-2,0),decreasing=TRUE)),replicate(2,sort(10^runif(10,-3,0),decreasing=TRUE)), replicate(2,sort(10^runif(10,-4,0), decreasing=TRUE)))    
   V <- rep(seq(100,2500,length.out=10),times=2)
   No <- rep(1:10,each=10)
   df <- data.frame(V,xx,yy,No)

从宽格式到长格式

library(reshape2)
df_new <- melt(df,id=c("No","xx","V"))

**拟合模型

As <- 220
Ax <- 1500

  model <- function(data){
  nlsLM(value~ifelse(V<Vs, 1-exp(-D*(1-(xx-As)/Ax)^2*(1-V/Vs)^2),1),
        data=data, start=c(D=1.21,Vs=1951),trace=T,control = nls.lm.control(maxiter=50))
}



library(plyr)
library(minpack.lm)

fit<- dlply(df_new, "No", .fun = model)

Adding Fitted Lines from an Existing Model

预测拟合值##的功能
predictvals <- function(model, xvar, yvar, xrange=NULL, samples=10, ...) {
  # If xrange isn't passed in, determine xrange from the models.
  # Different ways of extracting the x range, depending on model type
  if (is.null(xrange)) {
    if (any(class(model) %in% c("nls", "glm")))
      xrange <- range(model$model[[xvar]])
    else if (any(class(model) %in% "loess"))
      xrange <- range(model$x)
  }
  newdata <- data.frame(x = seq(xrange[1],xrange[2], length.out = samples))
  names(newdata) <- xvar
  newdata[[yvar]] <- predict(model, newdata = newdata, ...)
  newdata
}

形成在所有组中具有相同x范围的预测线

predvals<- ldply(fit, .fun=predictvals, xvar="V", yvar="value",xrange=range(df_new$V))
predvals$xx <- rep(rep(unique(df_new$xx),each=1),each=10)

最后用facet_wrap~xx

绘图
ggplot(df_new,aes(y=value,x=V, col=factor(xx)))+
  geom_point(size=3,alpha=.4)+
  geom_line(data=predvals,aes(col=factor(xx)))+
  scale_y_log10(breaks=c(1e-6,1e-5,1e-4,1e-3,1e-2,1e-1,1),limits = c(1e-6,1))+
  facet_wrap(~xx,scales="free_x")

enter image description here

为什么只有一条装配线。我期待两条拟合线,因为每个xx值有两个数据子集。哪个部分我不见了?任何指导将不胜感激。

1 个答案:

答案 0 :(得分:1)

尝试将另一个分组因素添加到aes中的geom_line来电。

... +
geom_line(data=predvals,aes(col=factor(xx), group=interaction(xx, No))) +
...

我没有查看您的代码的详细信息,所以如果这不是您想要的,请告诉我。