ggplot2繪製GO富集分析柱狀圖

1.使用clusterProfiler包進行GO富集分析

使用clusterProfiler的enrichGO函數來獲取GO分析

gene_id<-read.csv("SFTSV_24vscontrol_DE_mRNA.csv",header=T,stringsAsFactors = F)[,2]
library(clusterProfiler)
library(org.Hs.eg.db)
GO<-enrichGO(gene=gene_id,OrgDb = "org.Hs.eg.db",keyType = "ENSEMBL",ont="ALL",qvalueCutoff = 0.05,readable = T) #gene就是差異基因對應的向量,keyType指定基因ID的類型,默認爲ENTREZID,  該參數的取值可以參考keytypes(org.Hs.eg.db)的結果, 建議採用ENTREZID, OrgDb指定該物種對應的org包的名字,ont代表GO的3大類別,BP, CC, MF,也可以選擇ALL;  pAdjustMethod指定多重假設檢驗矯正的方法,這裏默認pAdjustMethod="BH",所以這裏沒有寫出來,cutoff指定對應的閾值,readable=TRUE代表將基因ID轉換爲gene  symbol。
go<-as.data.frame(GO)
View(go)
table(go[,1]) #查看BP,CC,MF的統計數目

 

 

可以看到GO富集分析條目一共有769條屬於BP,51條屬於CC,32條屬於MF

2.ggplot2繪製GO分析條目圖

1.按照qvalue升序排序,分別選出前10個BP,CC,MF的條目,由於enrichGO函數生成的數據框默認是按照qvalue升序排序,所以這裏我們只用選取前十個就行了

go_MF<-go[go$ONTOLOGY=="MF",][1:10,]
go_CC<-go[go$ONTOLOGY=="CC",][1:10,]
go_BP<-go[go$ONTOLOGY=="BP",][1:10,]
go_enrich_df<-data.frame(ID=c(go_BP$ID, go_CC$ID, go_MF$ID),
                         Description=c(go_BP$Description, go_CC$Description, go_MF$Description),
                         GeneNumber=c(go_BP$Count, go_CC$Count, go_MF$Count),
                         type=factor(c(rep("biological process", 10), rep("cellular component", 10),rep("molecular function",10)),levels=c("molecular function", "cellular component", "biological process")))

如上圖爲數據框go_enrich_df

2.ggplot2畫圖

## numbers as data on x axis
go_enrich_df$number <- factor(rev(1:nrow(go_enrich_df)))
## shorten the names of GO terms
shorten_names <- function(x, n_word=4, n_char=40){
  if (length(strsplit(x, " ")[[1]]) > n_word || (nchar(x) > 40))
  {
    if (nchar(x) > 40) x <- substr(x, 1, 40)
    x <- paste(paste(strsplit(x, " ")[[1]][1:min(length(strsplit(x," ")[[1]]), n_word)],
                       collapse=" "), "...", sep="")
    return(x)
  } 
  else
  {
    return(x)
  }
}

labels=(sapply(
  levels(go_enrich_df$Description)[as.numeric(go_enrich_df$Description)],
  shorten_names))
names(labels) = rev(1:nrow(go_enrich_df))

## colors for bar // green, blue, orange
CPCOLS <- c("#8DA1CB", "#FD8D62", "#66C3A5")
library(ggplot2)
p <- ggplot(data=go_enrich_df, aes(x=number, y=GeneNumber, fill=type)) +
  geom_bar(stat="identity", width=0.8) + coord_flip() + 
  scale_fill_manual(values = CPCOLS) + theme_test() + 
  scale_x_discrete(labels=labels) +
  xlab("GO term") + 
  theme(axis.text=element_text(face = "bold", color="gray50")) +
  labs(title = "The Most Enriched GO Terms")
#coord_flip(...)橫向轉換座標:把x軸和y軸互換,沒有特殊參數

發表評論
所有評論
還沒有人評論,想成為第一個評論的人麼? 請在上方評論欄輸入並且點擊發布.
相關文章