Entering edit mode
Hello, I have a fasta file with 750 sequences with 40 nucleotides and i want to search to each sequence what transcription factors there are. I don't want todo it manually because it will take a lot of time. So I should make a for loop or a list but i don't know how to do it. Thank you for your help.
library(JASPAR2020)
library(TFBSTools)
library(Biostrings)
library(S4Vectors)
library(ShortRead)
library(BSgenome.Mmusculus.UCSC.mm10)
fastafile1<- readDNAStringSet("ADAR.Mi_00. (new).20.fa")
readDNAStringSet("ADAR.Mi_00. (new).20.fa")
seqnames <- names(fastafile1)
sequence <-paste(fastafile1)
data(MA0004.1)
data(MA0006.1)
pwmList <- PWMatrixList(MA0004.1=toPWM(MA0004.1), MA0006.1=toPWM(MA0006.1),
use.names=TRUE)
readLines("ADAR.Mi_00. (new).20.fa")
subject <- DNAString("AGATCCCTTTAGCTCCTTGGATACTTTCTCTAGCTCCTCCA")
SiteSetList <- DNAStringSet(pwmList, subject, seqname="seq1",
min.score="60%", strand="*")
head(writeGFF3(SiteSetList))