1

可以说我有以下图表: 在此处输入图像描述

我只想选择第一行的第二张图。我如何使用 ggplot 函数执行此操作,如下所示:

plotAll<-function(data,size=2, alpha=0.4){
  combs <- expand.grid(names(data), names(data))
  out <- do.call(rbind, apply(combs, 1, function(x) {
    tt <- data[, x]; names(tt) <- c("V1", "V2")
    tt <- cbind(tt, id1 = x[1], id2 = x[2])
  }))

  library(plyr)
  df.text=ddply(out[out$id1==out$id2,],.(id1,id2),summarise,
                pos=max(V1)-(max(V1)-min(V1))/2)
  out[out$id1==out$id2,c("V1","V2")]<-NA
  out$labels <- rownames(out)
  out$labels<-sapply(out$labels, function(x){
    strsplit(x, "_")[[1]][1]
  })

  fam<-read.table('input/genomic_info_subset.tsv', sep='\t')

  idx<-match(out$labels,fam$V1)
  newcol<-fam$V4[idx]
  newcol<-as.character(newcol)
  out$fam<-newcol

  ggplot(data = out, aes(x = V2, y = V1)) +
    geom_text(data = out[!is.na(out$V1),], aes(label = labels, colour=fam), size=size, alpha=alpha) +
    facet_grid(id1 ~ id2,scales="fixed")+
    geom_text(data=df.text,aes(pos,pos,label=id1)) + geom_abline( slope=1 ) + 
    ggtitle("Corralation between measured & calculated affinities") +
    ylab("") + xlab("") + theme(panel.grid.minor.x=element_blank(), panel.grid.major.x=element_blank())
}

那么我可以在代码中的某处说,只选择第一行的第二行吗?还是从函数中提取数据框比单独绘制 1 更容易?我知道这个功能不适合重现我的问题,如果这真的是必要的,我将提供 .tsv 并输入数据。

4

1 回答 1

0

到目前为止,最简单的解决方案是简单地将数据子集为仅与第一行的第二列相关的数据。从这些类型的平面图中提取图可能是可能的,但并非易事。

于 2013-05-14T08:47:34.160 回答