五月天青色头像情侣网名,国产亚洲av片在线观看18女人,黑人巨茎大战俄罗斯美女,扒下她的小内裤打屁股

歡迎光臨散文網(wǎng) 會員登陸 & 注冊

Windows下分析二代測序RNASeq數(shù)據(jù)快速入門

2022-02-12 21:59 作者:Biogeek_Lau  | 我要投稿

原來不用繁瑣得安裝調(diào)試Linux系統(tǒng),在Windows下就能快速分析二代測序轉(zhuǎn)錄組數(shù)據(jù)。Rsubread就能實現(xiàn)此功能。說明書里面的圖很直觀,直接上圖了(圖來源https://bioconductor.org/packages/release/bioc/vignettes/Rsubread/inst/doc/SubreadUsersGuide.pdf)


種子和投票原理
輕松搞定短indel檢測
新的可變剪接位點也能快速檢測到

代碼如下:

setwd("G:/Rsubread_demo")

library(Rsubread)

buildindex(basename="ATG_index",reference="Arabidopsis_thaliana.TAIR10.dna_sm.chromosome.1.fa")

read1.files <- list.files(path = "E:/迅雷下載", pattern = ".+\\_1.fastq.gz", ignore.case = TRUE,

? ? ? ? ? ? ? ? ? ? ? ? full.names = TRUE, recursive = TRUE)?

read2.files <- list.files(path = "E:/迅雷下載", pattern = ".+\\_2.fastq.gz", ignore.case = TRUE,

? ? ? ? ? ? ? ? ? ? ? ? ? full.names = TRUE, recursive = TRUE)?

bamfiles=paste(stringi::stri_sub(read1.files,1,18),"_1.fastq.gz.subread.BAM",sep="")

align(index="ATG_index",readfile1=read1.files,readfile2=read2.files,nthreads=)

fc <- featureCounts(files=bamfiles,annot.ext="Arabidopsis_thaliana.TAIR10.36.gtf",isGTFAnnotationFile=T)

fc$stat

samplename <- colnames(fc$counts)

condition<- c("d0","d3","d3","d3","d3","d0","d0","d0")

samples=data.frame(samplename,condition)

samples

library(edgeR);library(limma)

x <- DGEList(fc$counts,lib.size = colSums(fc$counts),genes=fc$annotation[,c("GeneID","Length")],

? ? ? ? ? ? ?norm.factors = calcNormFactors(fc$counts),samples = samples$samplename,remove.zeros=T,?group = samples$condition)

isexpr <- rowSums(cpm(x) > 10) >= 2

x <- cpm(x[isexpr,],log=T)

treat_time <- factor(samples$condition)

design <- model.matrix(~0+treat_time)

colnames(design) <- levels(treat_time)

rownames(design)=samples$samplename?

group <- factor(samples$condition)

# View an MDS plot

plotMDS(x, labels=treat_time, col=as.numeric(treat_time),xlab="Dim1",ylab="Dim2")

fit <- lmFit(x,design)

contr <- makeContrasts(d3-d0,levels=design)

fit.contr <- eBayes(contrasts.fit(fit,contr))

dt <- decideTests(fit.contr,p.value = 0.05,adjust.method = "none",lfc = 1.3)

summary(dt)

options(digits=2)

topTable(fit.contr)

volcanoplot(fit.contr, coef=1,style = "p-value", highlight = 100, names = fit.contr$GeneID,?? hl.col="blue", xlab = "Log2 Fold Change")

注:

gtf下載地址:ftp://ftp.ensemblgenomes.org/pub/release-36/plants/gtf/arabidopsis_thaliana/Arabidopsis_thaliana.TAIR10.36.gtf.gz

fa下載地址:ftp://ftp.ensemblgenomes.org/pub/release-36/plants/fasta/arabidopsis_thaliana/dna/Arabidopsis_thaliana.TAIR10.dna_sm.toplevel.fa.gz

RNASeq下載地址:https://www.ebi.ac.uk/arrayexpress/experiments/E-MTAB-5130/samples/

Windows下分析二代測序RNASeq數(shù)據(jù)快速入門的評論 (共 條)

分享到微博請遵守國家法律
红原县| 焦作市| 肥城市| 兴安县| 镇原县| 河源市| 松江区| 靖远县| 凌海市| 栾城县| 铁岭市| 靖安县| 外汇| 通州区| 西乌珠穆沁旗| 晋中市| 阜平县| 澜沧| 淳化县| 名山县| 彭山县| 柳江县| 蒙山县| 平原县| 临清市| 安图县| 绍兴市| 胶南市| 武夷山市| 民权县| 大石桥市| 聂拉木县| 嘉鱼县| 崇礼县| 盐边县| 安平县| 咸宁市| 云梦县| 比如县| 新河县| 射阳县|