Hi,
I have analysed ribo-seq and rna-seq data from wild type or mutant mice tissue using riboSeqR.
But analysis failed at calling or reading frame step and all frame counts fell into 0.
My R console looks like this (only analysed WT data):
> library(riboSeqR) Loading required package: GenomicRanges Loading required package: BiocGenerics Loading required package: parallel Attaching package: ‘BiocGenerics’ The following objects are masked from ‘package:parallel’: clusterApply, clusterApplyLB, clusterCall, clusterEvalQ, clusterExport, clusterMap, parApply, parCapply, parLapply, parLapplyLB, parRapply, parSapply, parSapplyLB The following object is masked from ‘package:stats’: xtabs The following objects are masked from ‘package:base’: anyDuplicated, append, as.data.frame, as.vector, cbind, colnames, do.call, duplicated, eval, evalq, Filter, Find, get, intersect, is.unsorted, lapply, Map, mapply, match, mget, order, paste, pmax, pmax.int, pmin, pmin.int, Position, rank, rbind, Reduce, rep.int, rownames, sapply, setdiff, sort, table, tapply, union, unique, unlist, unsplit Loading required package: S4Vectors Loading required package: stats4 Creating a generic function for ‘nchar’ from package ‘base’ in package ‘S4Vectors’ Loading required package: IRanges Loading required package: GenomeInfoDb Loading required package: abind
> datadir <- system.file("extdata", package = "riboSeqR") > musFasta <- paste(datadir, "/refMrna.fa", sep = "") > fastaCDS <- findCDS(fastaFile = musFasta, startCodon = c("ATG"), stopCodon = c("TAG", "TAA", "TGA")) Read 2033198 items
> rnafiles <- paste(datadir, "/rna1", sep = "") > ribofiles <- paste(datadir, "/ribo1", sep = "") > riboDat <- readRibodata(ribofiles, replicates = c("WT")) Reading ribosomal files....done! > fCs <- frameCounting(riboDat, fastaCDS) Calling frames..........done! There were 15 warnings (use warnings() to see them) > warnings() Warning messages: 1: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 2: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 3: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 4: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 5: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 6: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 7: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 8: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 9: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 10: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 11: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 12: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 13: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 14: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated 15: In `levels<-`(`*tmp*`, value = if (nl == nL) as.character(labels) else paste0(labels, ... : duplicated levels in factors are deprecated > fS <- readingFrame(rC = fCs); fS 26 27 28 29 30 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 frame.ML 0 0 0 0 0
> sessionInfo() R version 3.2.2 (2015-08-14) Platform: x86_64-apple-darwin13.4.0 (64-bit) Running under: OS X 10.11.1 (El Capitan) locale: [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8 attached base packages: [1] stats4 parallel stats graphics grDevices utils datasets methods base other attached packages: [1] riboSeqR_1.2.0 abind_1.4-3 GenomicRanges_1.20.8 GenomeInfoDb_1.4.3 IRanges_2.2.9 [6] S4Vectors_0.6.6 BiocGenerics_0.14.0 loaded via a namespace (and not attached): [1] XVector_0.8.0
The refMrna.fa is mouse transcriptome reference from following website ( http://hgdownload.soe.ucsc.edu/goldenPath/mm9/bigZips/refMrna.fa.gz ). And the ribo1 and rna1 files are bowtie outputs mapped against mouse transcriptome using --supress 1,6,7,8 option.
the analysis using test chlamy files in a folder extdata is succesful.
Could anyone tell me some advice or information about this error ?
Thanks a lot.
Tak
Hi Tak,
I faced a similar issue just yesterday with Human Data - but I raised it on bioc-devel.. should have probably posted it here -
Here is a link to that discussion -
https://stat.ethz.ch/pipermail/bioc-devel/2015-October/008246.html
Hope that helps!
Sonali.