5

任何人都知道如何利用 ggplot 或 lattice 进行生存分析?做一个格状或类似面的生存图会很好。


所以最后我玩了一下,找到了一个 Kaplan-Meier 情节的解决方案。对于将列表元素放入数据框中的混乱代码,我深表歉意,但我想不出另一种方法。

注意:它只适用于两个层次的层。如果有人知道我可以如何使用x<-length(stratum)它,请告诉我(在 Stata 中,我可以附加到一个宏,不确定它在 R 中是如何工作的)。

ggkm<-function(time,event,stratum) {

    m2s<-Surv(time,as.numeric(event))

    fit <- survfit(m2s ~ stratum)

    f$time <- fit$time

    f$surv <- fit$surv

    f$strata <- c(rep(names(fit$strata[1]),fit$strata[1]),
            rep(names(fit$strata[2]),fit$strata[2])) 

    f$upper <- fit$upper

    f$lower <- fit$lower

    r <- ggplot (f, aes(x=time, y=surv, fill=strata, group=strata))
        +geom_line()+geom_ribbon(aes(ymin=lower,ymax=upper),alpha=0.3)

    return(r)
}
4

2 回答 2

4

我一直在使用以下代码lattice。第一个函数为一组绘制 KM 曲线,通常用作panel.group函数,而第二个函数为整个面板添加对数秩检验 p 值:

 km.panel <- function(x,y,type,mark.time=T,...){
     na.part <- is.na(x)|is.na(y)
     x <- x[!na.part]
     y <- y[!na.part]
     if (length(x)==0) return()
     fit <- survfit(Surv(x,y)~1)
     if (mark.time){
       cens <- which(fit$time %in% x[y==0])
       panel.xyplot(fit$time[cens], fit$surv[cens], type="p",...)
      }
     panel.xyplot(c(0,fit$time), c(1,fit$surv),type="s",...)
}

logrank.panel <- function(x,y,subscripts,groups,...){
    lr <-  survdiff(Surv(x,y)~groups[subscripts])
    otmp <- lr$obs
    etmp <- lr$exp
    df <- (sum(1 * (etmp > 0))) - 1
    p <- 1 - pchisq(lr$chisq, df)
    p.text <- paste("p=", signif(p, 2))
    grid.text(p.text, 0.95, 0.05, just=c("right","bottom"))
    panel.superpose(x=x,y=y,subscripts=subscripts,groups=groups,...)
}

审查指标必须为 0-1,此代码才能正常工作。用法如下:

library(survival)
library(lattice)
library(grid)
data(colon)  #built-in example data set
xyplot(status~time, data=colon, groups=rx, panel.groups=km.panel, panel=logrank.panel)

如果您只使用 'panel=panel.superpose' 那么您将无法获得 p 值。

于 2010-06-11T13:49:26.017 回答
1

我开始几乎完全遵循您在更新答案中使用的方法。但是 survfit 令人恼火的是它只标记变化,而不是每个刻度 - 例如,它会给你 0 - 100%、3 - 88% 而不是 0 - 100%、1 - 100%、2 - 100 %,3 - 88%。如果您将其输入 ggplot,您的线条将从 0 倾斜到 3,而不是保持平坦并在 3 处直线下降。根据您的应用程序和假设,这可能很好,但这不是经典的 KM 图。这就是我处理不同数量的地层的方式:

groupvec <- c()
for(i in seq_along(x$strata)){
    groupvec <- append(groupvec, rep(x = names(x$strata[i]), times = x$strata[i]))
}
f$strata <- groupvec

对于它的价值,这就是我最终这样做的方式 - 但这也不是真正的 KM 图,因为我没有计算 KM 估计本身(尽管我没有审查,所以这是等价的。 .. 我相信)。

survcurv <- function(surv.time, group = NA) {
    #Must be able to coerce surv.time and group to vectors
    if(!is.vector(as.vector(surv.time)) | !is.vector(as.vector(group))) {stop("surv.time and group must be coercible to vectors.")}

    #Make sure that the surv.time is numeric
    if(!is.numeric(surv.time)) {stop("Survival times must be numeric.")}

    #Group can be just about anything, but must be the same length as surv.time
    if(length(surv.time) != length(group)) {stop("The vectors passed to the surv.time and group arguments must be of equal length.")}

    #What is the maximum number of ticks recorded?
    max.time <- max(surv.time)  

    #What is the number of groups in the data?
    n.groups <- length(unique(group))

    #Use the number of ticks (plus one for t = 0) times the number of groups to
    #create an empty skeleton of the results.
    curves <- data.frame(tick = rep(0:max.time, n.groups), group = NA, surv.prop = NA)

    #Add the group names - R will reuse the vector so that equal numbers of rows
    #are labeled with each group.
    curves$group <- unique(group)

    #For each row, calculate the number of survivors in group[i] at tick[i]
    for(i in seq_len(nrow(curves))){
      curves$surv.prop[i] <- sum(surv.time[group %in% curves$group[i]] > curves$tick[i]) /
          length(surv.time[group %in% curves$group[i]])
    }

  #Return the results, ordered by group and tick - easier for humans to read.
  return(curves[order(curves$group, curves$tick), ])   

}
于 2010-07-07T16:24:07.003 回答