| filter_motifs {universalmotif} | R Documentation |
Filter motifs based on the contents of available universalmotif
slots. If the input motifs are not of universalmotif, then they
they will be converted for the duration of the filter_motifs() operation.
filter_motifs(motifs, name, altname, family, organism, width, alphabet, type, icscore, nsites, strand, pval, qval, eval, extrainfo)
motifs |
|
name |
|
altname |
|
family |
|
organism |
|
width |
|
alphabet |
|
type |
|
icscore |
|
nsites |
|
strand |
|
pval |
|
qval |
|
eval |
|
extrainfo |
|
list Motifs. An attempt will be made to preserve the original
class, see convert_motifs() for limitations.
Benjamin Jean-Marie Tremblay, b2tremblay@uwaterloo.ca
## By minimum IC:
jaspar <- read_jaspar(system.file("extdata", "jaspar.txt",
package = "universalmotif"))
jaspar.ic10 <- filter_motifs(jaspar, icscore = 10)
## By organism:
if (requireNamespace("MotifDb", quietly = TRUE) && .Platform$OS.type == "unix") {
library(MotifDb)
motifs <- convert_motifs(MotifDb)
motifs <- filter_motifs(motifs, organism = c("Athaliana", "Mmusculus"),
extrainfo = c("dataSource" = "cisbp_1.02"))
}