Has anyone been able to use a non-human genome with OmicCircos? The documentation/paper claim hg18/hg19/mm9/mm10 are supported but it doesn't look like the proper extdata for mouse is included with the package.
I tried to munge the UCSC cytogentic data into the right format but it looks like there is a different way of reading the extdata than user supplied dataframes. The following code will reproduce the problem and show the plot differences.
library("OmicCircos") par(mar=c(2, 2, 2, 2)) plot(c(1,800), c(1,800), type="n", axes=FALSE, xlab="", ylab="") circos(R=200, type="chr", cir="hg18", print.chr.lab=TRUE, W=4) #cir Error plot(c(1,800), c(1,800), type="n", axes=FALSE, xlab="", ylab="") circos(R=200, type="chr", cir="mm9", print.chr.lab=TRUE, W=4) dir(paste0(.libPaths(),"/OmicCircos/data")) data(UCSC.hg18.chr) data(UCSC.hg18) #recreate mm9 data library("biovizBase") mm9IdeogramCyto <- as.data.frame(getIdeogram("mm9", cytoband = TRUE)) UCSC.mm9.chr<-mm9IdeogramCyto[,c("seqnames","start","end","name","gieStain")] colnames(UCSC.mm9.chr)<-c("chrom","chromStart","chromEnd","name","gieStain") UCSC.mm9<-as.data.frame(segAnglePo(seg.dat=UCSC.mm9.chr,seg=paste0("chr",c(rep(1:19),"X","Y"))),stringsAsFactors=F) #seq data head(UCSC.hg18) head(UCSC.mm9) #cyto data head(UCSC.hg18.chr) head(UCSC.mm9.chr) # par(mar=c(2, 2, 2, 2)) plot(c(1,800), c(1,800), type="n", axes=FALSE, xlab="", ylab="") circos(R=200, type="chr", cir="mm9", print.chr.lab=TRUE, W=4) #doesn't find it plot(c(1,800), c(1,800), type="n", axes=FALSE, xlab="", ylab="") circos(R=200, type="chr", cir=UCSC.mm9, print.chr.lab=TRUE, W=4) plot(c(1,800), c(1,800), type="n", axes=FALSE, xlab="", ylab="") circos(R=200, type="chr", cir=UCSC.hg18, print.chr.lab=TRUE, W=4) #reads df different than extdata sessionInfo()
My sessionInfo(). I also tried it with R 3.1.1.
> sessionInfo() locale: attached base packages: other attached packages: loaded via a namespace (and not attached): |
|
|
|
|