| seqAddValue {SeqArray} | R Documentation |
Add or modify the values in a GDS file with hash code
seqAddValue(gdsfile, varnm, val, desp="", replace=FALSE, compress="LZMA_RA",
packed=FALSE)
gdsfile |
a |
varnm |
the variable name, e.g., "sample.id", "variant.id", "chromosome", "annotation/info/NEW_VARIABLE" |
val |
the R value can be integers, real numbers, characters,
factor, logical or raw variable, |
desp |
variable description |
replace |
if |
compress |
the compression method can be "" (no compression), see
|
packed |
FALSE |
Return none.
Xiuwen Zheng
library(SeqArray)
# the file of GDS
gds.fn <- seqExampleFileName("gds")
file.copy(gds.fn, "tmp.gds", overwrite=TRUE)
# display
(f <- seqOpen("tmp.gds", FALSE))
show(index.gdsn(f, "sample.id"))
seqAddValue(f, "sample.id", 1:90, replace=TRUE)
show(index.gdsn(f, "sample.id"))
show(index.gdsn(f, "chromosome"))
v <- seqGetData(f, "chromosome")
seqAddValue(f, "chromosome", paste0("chr", v), replace=TRUE)
show(index.gdsn(f, "chromosome"))
table(seqGetData(f, "chromosome"))
# sample annotation
seqAddValue(f, "sample.annotation", data.frame(ii=1:90, y=rep("A", 90)), replace=TRUE)
seqAddValue(f, "sample.annotation/float", (1:90)/90)
# close the GDS file
seqClose(f)
# remove the temporary file
unlink("tmp.gds", force=TRUE)