虽然现在是高通量测序的时代,但是GEO、ArrayExpress等数据库储存并公开大量的基因表达芯片数据,还是会有大量的需求去处理芯片数据,并且建模或验证自己所研究基因的表达情况,芯片数据的处理也可能是大部分刚学生信的道友入门R语言数据处理的第一次实战,因此准备更新100个基因表达芯片或转录组高通量数据的处理。
可以看到GSE27342是基因表达芯片数据,因此可以使用GEOquery包下载数据
using(tidyverse, GEOquery, magrittr, data.table, AnnoProbe, clusterProfiler, org.Hs.eg.db, org.Mm.eg.db)
注:using
是我写的函数,作用是一次性加载多个R包,不用写双引号,并且不在屏幕上打印包的加载信息,可以参考之前的推文《如何优雅地管理R包》using的定义;函数名字using是在模仿Julia语言中的包加载函数
因为文件太大,在R内下载失败,可通过图片中的方法下载文件,并且把下载后的文件放在destdir = "./"即当前工作目录,GEOquery::getGEO便能跳过下载,直接使用本地的文件。
geo_accession <- "GSE27342"
gset <- GEOquery::getGEO(geo_accession, destdir = "./", AnnotGPL = F, getGPL = F)
eSet <- gset[[1]]
gpl <- eSet@annotation
这部分是很关键的,可以筛选一下分组表型信息,只保留自己需要的样本,在这里只保留tissue:ch1中 normal gastric tissue和gastric cancer tissue的样本,作为后续分析的样本(根据自己的研究目的筛选符合要求的样本)
pdata <- pData(eSet)
geo_accession | age:ch1 | gender:ch1 | grade:ch1 | Stage:ch1 | tissue:ch1 |
---|---|---|---|---|---|
GSM675890 | 41 | F | unknown | IV | normal gastric tissue |
GSM675891 | 41 | F | unknown | IV | gastric cancer tissue |
GSM675892 | 62 | F | unknown | III | normal gastric tissue |
GSM675893 | 62 | F | unknown | III | gastric cancer tissue |
GSM675894 | 54 | F | G2 | III | normal gastric tissue |
GSM675895 | 54 | F | G2 | III | gastric cancer tissue |
pdata %<>%
dplyr::mutate(
Sample = geo_accession,
Group = dplyr::case_when(
stringr::str_detect(`tissue:ch1`, "normal") ~ "Control",
stringr::str_detect(`tissue:ch1`, "cancer") ~ "Cancer",
TRUE ~ NA)
) %>%
dplyr::filter(!is.na(Group)) %>%
dplyr::rename(Age=`age:ch1`,Gender=`gender:ch1`,Grade=`grade:ch1`,Stage=`Stage:ch1`) %>%
dplyr::select(Sample, Group, Gender, Grade, Stage)
数据大小大于50需要取log
exprs_mtx <- exprs(eSet)
range(exprs_mtx, na.rm = TRUE)
# 5e-05 1957353.939
exprs_mtx <- log2(exprs_mtx+1)
probe_exprs <- as.data.table(exprs_mtx, keep.rownames = "ProbeID")
下载GPL18990注释信息https://www.ncbi.nlm.nih.gov/geo/query/acc.cgi?acc=GPL5175,需要ID和Gene Symbol列
从GEO网站的平台注释文件中获取探针与GeneID对应关系
idmaps2 <- function(ann_file, ProbeID = "ID", GeneID = "gene_assignment", skip = 12, pattern = "control") {
temp <- fread(ann_file, skip = skip, nThread = 8)
vars <- c(ProbeID, GeneID)
temp <- temp[, ..vars]
data.table::setnames(temp, c("ProbeID", "GeneID"))
genes <- stringr::str_split(temp$GeneID," // ",simplify = TRUE)[,2]
temp %<>% dplyr::mutate(GeneID=stringr::str_split(string=GeneID,pattern = " // ",simplify = TRUE)[,2] %>%
stringr::str_remove_all(" ")) %>%
data.table::as.data.table()
temp <- temp[!is.null(GeneID), ][!is.na(GeneID), ][GeneID != "", ][GeneID != "---", ][!stringr::str_detect(string = GeneID, pattern = pattern), ]
return(as.data.frame(temp))
}
probe2symbol <- idmaps2("GPL5175-3188.txt", GeneID = "gene_assignment", skip = 12)
把表达矩阵中的探针名转换为基因名;transid是我写的一个R函数,有需要可以联系我的公众号@恩喜玛生物,加入交流群
fdata <- transid(probe2symbol, probe_exprs)
common_samples <- base::intersect(colnames(fdata),pdata$Sample)
fdata %<>% select(all_of(c("GeneID",common_samples)))
fwrite(fdata, file = stringr::str_glue("{geo_accession}_{gpl}_fdata.csv.gz"))
pdata %<>% dplyr::filter(Sample %in% common_samples)
fwrite(pdata, file = stringr::str_glue("{geo_accession}_{gpl}_pdata.csv"))