diff ezBAMQC/test-data/output/data/smp_correlation.r @ 0:dfa3745e5fd8

Uploaded
author youngkim
date Thu, 24 Mar 2016 17:12:52 -0400
parents
children
line wrap: on
line diff
--- /dev/null	Thu Jan 01 00:00:00 1970 +0000
+++ b/ezBAMQC/test-data/output/data/smp_correlation.r	Thu Mar 24 17:12:52 2016 -0400
@@ -0,0 +1,78 @@
+library(corrplot)
+srcfiles = c("test1/data/smp0.geneAbundance.txt","test1/data/smp1.geneAbundance.txt","test1/data/smp2.geneAbundance.txt")
+destfile = "/sonas-hs/bsr/hpc/data/yjin/test_BAMqc/exp/test1/figs/smp_corr.png"
+f1 = read.delim(srcfiles[1],header=T)
+MM=matrix(nrow=length(f1[,1]),ncol=length(srcfiles))
+rownames(MM)=f1[,1]
+MM[,1]=f1[,2]
+for (i in 2:length(srcfiles)){ 
+    f = read.delim(srcfiles[i],header=T)
+    MM[,i] = f[,2] }
+colnames(MM)=c("smp0","smp1","smp2")
+libSize<-colSums(MM)
+MM<-t(t(MM)*1000000/libSize)
+ss<-rowSums(MM)
+M1<-MM[ss>0,]
+MM_s<-t(scale(t(M1)))
+M.cor<-cor(MM_s,method='sp')
+M.cor[is.na(M.cor)]<- 0
+png(destfile,width=500,height=500,units='px')
+corrplot(M.cor,is.corr=T,order='FPC',method='color',type='full',add=F,diag=T)
+dev.state = dev.off()
+nz_genes = length(M1[,1])
+destfile = "/sonas-hs/bsr/hpc/data/yjin/test_BAMqc/exp/test1/figs/smp_reproducibility.png"
+if(nz_genes >0) { 
+png(destfile,width=500,height=500,units='px')
+nz_gene_mm = rep(0,length(M1[1,]))
+for(i in 1:length(M1[1,])) { 
+nz_gene_mm[i] = length(which(M1[,i]>0))/nz_genes * 100 } 
+bplt <- barplot(nz_gene_mm,beside=T,border='NA',space=1.5,ylim=c(0,100),ylab='Genes reproducibly detected (%)',col='blue',names.arg=colnames(MM))
+text(y= nz_gene_mm+2, x= bplt, labels=paste(as.character(round(nz_gene_mm,digits=1)),'%',sep=''), xpd=TRUE)
+dev.state = dev.off()}
+destfile = "/sonas-hs/bsr/hpc/data/yjin/test_BAMqc/exp/test1/figs/smp_var.png"
+png(destfile,width=500,height=500,units='px')
+mad = rep(0,length(M1[,1]))
+nz_gene_median = rep(0,length(M1[,1]))
+for(i in 1:length(M1[,1])) { 
+nz_gene_median[i] = median(M1[i,]) 
+mad[i] = median(abs(M1[i,]-nz_gene_median[i])) } 
+mad2 = mad[nz_gene_median >0] 
+nz_gene_median2 = nz_gene_median[nz_gene_median>0] 
+mad_vs_median = mad2/nz_gene_median2 
+nz_gene_median3 = log(nz_gene_median2, base=2)
+dd<-data.frame(nz_gene_median3,mad_vs_median) 
+x = densCols(nz_gene_median3,mad_vs_median, colramp=colorRampPalette(c('black', 'white')))
+dd$dens <- col2rgb(x)[1,] + 1L 
+cols <-  colorRampPalette(c("#000099", "#00FEFF", "#45FE4F", "#FCFF00", "#FF9400", "#FF3100"))(256)
+dd$col <- cols[dd$dens]
+plot(mad_vs_median ~ nz_gene_median3,data=dd[order(dd$dens),], col=col, pch=20,xlab="Gene expression (median RPM log2)",ylab="Median absolute deviation/median")
+dev.state = dev.off()
+destfile = "/sonas-hs/bsr/hpc/data/yjin/test_BAMqc/exp/test1/figs/smp_cov.png"
+png(destfile,width=500,height=500,units='px')
+xname=c("<0.5","0.5-10","10-100",">=100")
+Fn_mm = matrix(0,nrow=length(xname),ncol=length(M1[1,]))
+rownames(Fn_mm) = xname 
+colnames(Fn_mm) = c("smp0","smp1","smp2") 
+for(i in 1:length(M1[1,])) { 
+Fn_mm[1,i] = length(which(M1[,i]<0.5)) 
+Fn_mm[2,i] = length(which(M1[,i]>=0.5 & M1[,i]<10))
+Fn_mm[3,i] = length(which(M1[,i]>=10 & M1[,i]<100))
+Fn_mm[4,i] = length(which(M1[,i]>=100)) }
+barplot(Fn_mm,main="Gene abundance (RPM)",xlab="Sample",ylab="Frequency",col=c("green","blue","red","yellow"),legend=xname)
+dev.state = dev.off()
+destfile3 = "/sonas-hs/bsr/hpc/data/yjin/test_BAMqc/exp/test1/figs/smp_qual.png"
+srcfiles3 = c("test1/data/smp0.mapq_profile.xls","test1/data/smp1.mapq_profile.xls","test1/data/smp2.mapq_profile.xls")
+png(destfile3,width=500,height=500,units='px')
+xname=c("<3","3-10","10-20","20-30",">=30")
+Fn_mm = matrix(0,nrow=length(xname),ncol=length(srcfiles3))
+rownames(Fn_mm) = xname 
+colnames(Fn_mm) = c("smp0","smp1","smp2") 
+for(i in 1:length(srcfiles3)) { 
+  f = read.delim(srcfiles3[i],header=T)
+ if(length(which(f[,1]<3)) >0){ Fn_mm[1,i] = sum(f[which(f[,1]<3),3])/f[1,2]} 
+if(length(which(f[,1]>=3 & f[,1]<10)) >0) {Fn_mm[2,i] = sum(f[which(f[,1]<10 & f[,1]>=3),3])/f[1,2]} 
+if(length(which(f[,1]>=10 & f[,1]<20)) >0)  {Fn_mm[3,i] = sum(f[which(f[,1]<20 & f[,1]>=10),3])/f[1,2] }
+if(length(which(f[,1]>=20 & f[,1]<30)) >0) {Fn_mm[4,i] = sum(f[which(f[,1]<30 & f[,1]>=20),3])/f[1,2]} 
+if(length(which(f[,1]>=30)) >0) {Fn_mm[5,i] = sum(f[which(f[,1]>=30),3])/f[1,2] }} 
+barplot(Fn_mm,xlab="Sample",main="Mapping Quality",ylim=c(0,1),ylab="Frequency",col=c("blue","green","yellow","orange","red"),legend=xname)
+dev.state = dev.off()