Why there are two pfms in the result of oligoSummary function of ChIPpeakAnno package?
0
0
Entering edit mode
@c43e8a07
Last seen 7 months ago
China

I am using ChIPpeakAnno package, after calculating the motif of the fasta sequences of the peaks I called, I realize there are two pfms in the results, one is of 6 bases, while the other is of 8 bases. In tutorial, the pipeline just dropped the second pfm. I am confused since I set the parameter "oligoLength" as 6, why there is another pfm with 8 bases numbers? Really hope someone brilliant can explain it to me, many thanks!

setwd('E:\\Project')
library(ChIPpeakAnno)
library(tidyverse)
library(EnsDb.Hsapiens.v86)
annoData <- toGRanges(EnsDb.Hsapiens.v86, feature = "gene")
library(TxDb.Hsapiens.UCSC.hg38.knownGene)
library(UpSetR)
library(org.Hs.eg.db)
library(clusterProfiler)
library(ggplot2)
library(BSgenome.Hsapiens.UCSC.hg38)
library(seqinr)
library(motifStack)

test <- read_delim('DMSO-K4_peaks.broadPeak', col_names = F)
test_clean <- d4[grep("^chr", test$X1), ]
write_delim(test_clean, 'test_clean.broadPeak', col_names = F)
tcp <- toGRanges('test_clean.broadPeak', format="broadPeak", header=F)
seq <- getAllPeakSequence(tcp, upstream=20, downstream=20, genome=Hsapiens)
write2FASTA(seq, "seq.fa")
os <- oligoSummary(seq, oligoLength=6, MarkovOrder=3, 
                   quickMotif=T)

there are two list elements in d4os$motifs Here are the following steps that are recommended by tutorial, you can see that the tutorial is only choosing the first pfm. So after I set the "oligoLength" to 6, why there is a second pfm?

pfm <- mapply(function(.ele, id)
  new("pfm", mat=.ele, name=paste("SAMPLE motif", id)), 
  os$motifs, 1:length(os$motifs))
motifStack(pfm[[1]])
ChIPpeakAnno ChIPSeq MotifDiscovery • 277 views
ADD COMMENT

Login before adding your answer.

Traffic: 618 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