Problem
Hello, I have trouble with GdsGenotypeReader. my gdsfile can successfully opened by "seqOpen" . However, when I used "GdsGenotypeReader" , I got some error waring. My code and waring error were pasted below. So, how to solve this problem. Thanks for your help.
R codeand warning error:
(R4.3.1)
library(SeqArray)
library(GWASTtools)
library(GENESIS)
gdsfile <- seqOpen("C:\Users\Desktop\chr8.gds")
geno <- GdsGenotypeReader(gdsfile)
[Error in index.gdsn(object@handler, varname) : No such GDS node "snp.id"!]
or
geno <- GdsGenotypeReader(filename = "chr8.gds")
[Error in openfn.gds(filename = filename, allow.fork = allow.fork) : The file 'C:\Users\Desktop\chr8.gds' has been created or opened.]
My variant id name changed like this:
head(seqGetData(gdsfile,"annotation/id"))
[1] "chr8_700009_ACCCGCACACGCGCACAGACCCTCACAGGCGCACAGG_A"
[2] "chr8_700114_C_G"
[3] "chr8_700138_C_CGCACAGGCGCACAGACCCGCACACGCGCACAGGCCCGCACACGCGCACAGGCCG"
[4] "chr8_700153_A_G"
[5] "chr8_700209_GCGCACACACCCGCACACGCGCACAGGCC_G"
[6] "chr8_700216_C_G"