[BioC] ChomoViz atomic error
Morten Mattingsdal
morten.mattingsdal at student.uib.no
Fri May 20 12:06:44 CEST 2005
Hello everybody,
I want to explore my data in ChromoViz package, but i have some
difficulties in performing the cViz command. I get an error telling me
that my data object must me atomic, but is.atmoic insists that the
object is indeed atmoic. Yourdata is the example data on the homepage of
ChromoViz and read into R as a tab file
library(RSvgDevice)
library(XML)
library(ChromoViz)
data(cytoBand9606)
yourdata<-read.table("Result.txt")
cViz(yourdata, cytoBand9606)
#Error in sort(unique.default(x), na.last = TRUE) :
# `x' must be atomic
is.atomic(yourdata)
# [1] FALSE
yourdata2<-as.matrix(yourdata)
is.atomic(yourdata2)
# [1] TRUE
cViz(yourdata2, cytoBand9606)
#Error in sort(unique.default(x), na.last = TRUE) :
# `x' must be atomic
What is this error trying to tell me? Any help is highly appriciated
regards
morten
More information about the Bioconductor
mailing list