DEXSeqHTML and biomart object
1
0
Entering edit mode
ZheFrench ▴ 40
@zhefrench-11689
Last seen 16 months ago
France

Could you provide a more detailed example of code to use biomart object and extra columns to add for example GeneSymbol in the output of DEXSeqHTML  ?

Not clear to me how you use mart  and attributes parameters in DEXSeqHTML

 

DEXSeq • 1.4k views
ADD COMMENT
1
Entering edit mode
Alejandro Reyes ★ 1.9k
@alejandro-reyes-5124
Last seen 4 days ago
Novartis Institutes for BioMedical Rese…

Hi! The easiest way to do that would be something along these lines:

 

library(DEXSeq)
library(biomaRt)

data("pasillaDEXSeqDataSet", package="pasilla")
dxr <- DEXSeq( dxd )

mart <- useMart( biomart="ensembl", dataset="dmelanogaster_gene_ensembl" )
extraCols <- getBM(attributes=c("ensembl_gene_id", "ensembl_peptide_id"), filter="ensembl_gene_id",
                   mart=mart, values=geneIDs(dxd) )
extraCols <- extraCols[!duplicated(extraCols$ensembl_gene_id),]
rownames(extraCols) <- extraCols$ensembl_gene_id
DEXSeqHTML( dxr, extraCols=extraCols )

 

ADD COMMENT
1
Entering edit mode

Ok so this looks like the answer to my question, sorry I didn't see it first.  I am confused, how do you know for sure that the 'ensembl_gene_id' lines up with the 'ensembl_gene_id' in dxr?  I guess because you pull from it  initially with values=geneIDs(dxd)?  Thanks!!

ADD REPLY
0
Entering edit mode

Names are matched based on the rownames of extraCols. Thus, the rownames of extraCols should match what is stored in geneIDs(). 

Another minimal example:

library(DEXSeq)
data(pasillaDEXSeqDataSet, package="pasilla")
dxr <- DEXSeq( dxd )
extraCols <- data.frame( ids=unique(geneIDs(dxd)), mygeneIDs=sprintf("gene%0.3d", seq_along(unique(geneIDs(dxd)))))
rownames(extraCols) <- extraCols$ids
DEXSeqHTML( object=dxr, extraCols=extraCols )
ADD REPLY

Login before adding your answer.

Traffic: 714 users visited in the last hour
Help About
FAQ
Access RSS
API
Stats

Use of this site constitutes acceptance of our User Agreement and Privacy Policy.

Powered by the version 2.3.6