NOT_CRAN <- identical(tolower(Sys.getenv("NOT_CRAN")), "true") eval_vignette <- NOT_CRAN & memes::meme_is_installed() knitr::opts_chunk$set( collapse = TRUE, comment = "#>", purl = eval_vignette, eval = eval_vignette )
library(memes) suppressPackageStartupMessages(library(GenomicRanges)) library(magrittr)
AME requires a series of input sequences to scan for motif enrichment.
runAme()
accepts sequence input in the following formats:
Biostrings::XStringSet
objectBiostrings::XStringSet
objectsNOTE XStringSet
inputs can be easily generated for DNA sequences from a
GRanges object using the get_sequence()
function
data("example_peaks", package = "memes") dm.genome <- BSgenome.Dmelanogaster.UCSC.dm3::BSgenome.Dmelanogaster.UCSC.dm3 sequence <- example_peaks %>% get_sequence(dm.genome)
AME scans input sequences against a database of known motifs and tests for
enrichment of each motif in the database. runAme()
can accept a database in
the following formats:
runDreme
memes can be configured to use a default .meme format file as the query
database, which it will use if the user does not provide a value to database
when calling runAme()
. The following locations will be searched in order.
meme_db
option, defined using options(meme_db = "path/to/database.meme")
meme_db
option can also be set to an R object, like a universalmotif list.MEME_DB
environment variable defined in .Renviron
MEME_DB
variable will only accept a path to a .meme fileNOTE: if an invalid location is found at one option, runAme()
will fall
back to the next location if valid (eg if the meme_db
option is set to an
invalid file, but the MEME_DB
environment variable is a valid file, the
MEME_DB
path will be used.
options(meme_db = system.file("extdata/flyFactorSurvey_cleaned.meme", package = "memes", mustWork = TRUE))
runAme()
supports running AME using three modes:
| AME Mode | Description | Command |
|:-----------------:|:--------------------------:|:------------------------------------------------|
| Vs Shuffled | Input vs Shuffled Sequence | runAme(input = sequence, control = "shuffle")
|
| Discriminative | Input vs Control Sequence | runAme(input = sequence, control = control)
|
| Partitioning | Rank Input by fasta score | runAme(input = sequence, control = NA)
|
ame_vs_shuffle <- runAme(sequence)
ame_vs_control <- runAme(sequence[1:5], sequence[6:10])
To run AME using partitioning mode, the fasta header must contain a score value
for each entry in the form: ">entry_name score". The get_sequences()
score
argument allows users to set the score value to a column value from input
regions.
sequence_scored <- example_peaks %>% plyranges::mutate(score = seq_along(.)) %>% get_sequence(dm.genome, score = "score") names(sequence_scored)[1]
ame_partition <- runAme(sequence_scored, control = NA)
If using a list input to runAme()
, it will dispatch multiple AME runs for each
object in the list.
data("example_chip_summits", package = "memes") seq_by_behavior <- example_chip_summits %>% plyranges::mutate(width = 100) %>% split(mcols(.)$e93_sensitive_behavior) %>% get_sequence(dm.genome)
ame_by_behavior <- runAme(seq_by_behavior)
If the input to runAme()
is a named list of XStringSet
objects, control
can be set to one or more values from names(input)
to use those regions as
background. It will skip running those regions as the input. The following code
will result in these comparisons:
ame_by_behavior_vs_static <- runAme(seq_by_behavior, control = "Static")
If multiple names are used in the control
section, they will be combined
together to make a single control set which will be used for all comparisons.
Here, we use "Static" and "Decreasing" sites as the control, which will result
in only running 1 comparison: Increasing vs Static+Decreasing.
runAme(seq_by_behavior, control = c("Static", "Decreasing"))
data("example_ame", package = "memes") ame_by_behavior_vs_static <- example_ame
AME will return different output formats depending on the method
used. For
detailed information about these values see the AME Output description
webpage. As a general rule of
thumb, runAme()
will return the same column names described in the webpage,
except dashes are removed and all column names are lowercase.
ame_by_behavior_vs_static$Decreasing %>% names
If runAme()
is run with method = "fisher"
, the sequences output can be added
to the results by setting sequences = TRUE
. This will be added as a list
column named sequences
that can be unnested using tidyr::unnest()
.
The plot_ame_heatmap()
function provides a method to easily generate
visualizations of AME results.
To plot results from multiple runs together, they must first be joined into 1
data frame. The ame_by_behavior_vs_static
object is a list whose names correspond to the
E93 response (Increasing or Decreasing). The list can be combined into a data.frame using
dplyr::bind_rows
. Setting .id = "behavior
creates a new column
behavior
that contains the names from the ame_by_behavior_vs_static
list. In this
way, the resulting data.frame contains all AME results for each run, which can
be distinguished by the behavior
column.
ame_by_behavior_vs_static %>% # AME results in list format are easily combined using dplyr::bind_rows # .id will specify a column to hold the list object names dplyr::bind_rows(.id = "behavior") %>% # setting group to a column name will split the results on the y-axis plot_ame_heatmap(group = behavior)
There are several nuances when making heatmap visualizations of these data. The following examples highlight some of these issues and provide alternative approaches and solutions.
We start by using different binding site categories as input.
seq_by_binding <- example_chip_summits %>% plyranges::mutate(width = 100) %>% split(mcols(.)$peak_binding_description) %>% get_sequence(dm.genome)
ame_by_binding <- seq_by_binding %>% runAme
# Allows vignette to build on systems w/o functioning MEME suite data("example_ame_large", package = "memes") ame_by_binding <- example_ame_large
ame_res <- ame_by_binding %>% dplyr::bind_rows(.id = "binding_type")
It is possible to aggregate results from multiple runs into a heatmap by setting
the group
parameter in plot_ame_heatmap()
.
This is too many hits to properly view in this vignette, but you can see that the heatmap will plot motifs by their overlap across groups, where unique motifs are on the left, and shared motifs are on the right.
ame_res %>% plot_ame_heatmap(group = binding_type)
The dynamic range of p-values in these data varies between groups. For this reason, a simple heatmap scaled using all data values will make it more difficult to interpret within groups with a lower dynamic range of values. In other words, because the dynamic range of values are different between experiments, placing them on the default scale for comparison may not always be the most optimal visualization.
We can partially overcome this limitation by filling the heatmap with the
normalized rank value for each TF, which accounts for differences in total number of
discovered motifs between AME runs. Although it does not completely abrogate
differences, the signal values for high-ranked motifs within groups will be more
comparable. However, the normalized rank visualization eliminates all real values related to statistical significance!
Instead, this visualization represents the relative ranks of hits within an AME
run, which already pass a significance threshold set during runAME()
. This
means that even if several motifs have similar or even identical p-values, their
heatmap representation will be a different color value based on their ranked
order in the results list. This tends to only be useful when there are a large
number of hits (>=100). Both visualizations can be useful and reveal different
properties of the data to the user. If in doubt, prefer the
-log10(adj.pvalue)
representation.
Below is a comparison of the distribution of values when using
-log10(adj.pvalue)
(A) vs normalized ranks (B). Because orphan sites tend to
have smaller p-values overall, the heatmap scale will be skewed towards the high
values in the orphan data, making ectopic and entopic heat values lighter by
comparison.
ame_res %>% ame_compare_heatmap_methods(group = binding_type)
To use the normalized rank value, set value = "normalize"
in plot_ame_heatmap()
.
This plot reveals that the motifs which tend to be shared across all 3 categories tend to be higher ranks in the output than the motifs unique to the different categories, which tend to come from lower ranks. This suggests that although there are differences in motif content across the three categories, they may be largely similar in motif makeup. We will investigate this question in more detail in the "Denovo motif similarity" section.
library(ggplot2) (normalize_heatmap <- ame_res %>% dplyr::group_by(binding_type, motif_alt_id) %>% dplyr::filter(adj.pvalue == min(adj.pvalue)) %>% plot_ame_heatmap(group = binding_type, id = motif_alt_id, value = "normalize") + # All ggplot functions can be used to extend or edit the heatmap plots ggtitle("value = \"normalize\""))
An additional third option exists to rescale the -log10(adj.pvalue)
heatmap to
change the heatmap's maxiumum color value. This allows the user to maintain
values which represent significance, but rescale the data to capture the lower
end of the dynamic range. Using the cumulative distribution plot above, a
reasonable cutoff is anywhere between 7 & 10, which captures > 90% of the data
for ectopic and entopic sites.
A comparison of all three methods can be seen below.
pval_heatmap <- ame_res %>% dplyr::group_by(binding_type, motif_alt_id) %>% dplyr::filter(adj.pvalue == min(adj.pvalue)) %>% plot_ame_heatmap(group = binding_type, id = motif_alt_id) + ggtitle("value = -log10(adj.pvalue)") scale_heatmap <- ame_res %>% dplyr::group_by(binding_type, motif_alt_id) %>% dplyr::filter(adj.pvalue == min(adj.pvalue)) %>% plot_ame_heatmap(group = binding_type, id = motif_alt_id, scale_max = 7.5) + ggtitle("value = -log10(adj.pvalue) (scale capped at 7.5)")
Below is a comparison using the -log10(adj.pvalue)
vs normalize
methods for
plotting the heatmap. Note how the different plots highlight different data
properties. The -log10(adj.pvalue)
plot shows overall significance of each
hit, while normalize
method shows the relative rank of each hit within a
binding_type
. Lowering the maximum scale value in C) does a better job than A)
at visualizing differences in significance along the ectopic and entopic rows at
the cost of decreasing the dynamic range of the orphan row. Selecting a
visualization for publication will depend heavily on context, but if in doubt,
prefer one which includes information of statistical significance as in A) or C).
cowplot::plot_grid(pval_heatmap, normalize_heatmap, scale_heatmap, ncol = 1, labels = "AUTO")
importAme()
can be used to import an ame.tsv
file from a previous run
on the MEME server or on the commandline. Details for how to save data from the
AME webserver are below.
Optionally, if AME was run on the commandline with --method fisher
, the user
can pass a path to the sequences.tsv
file to the sequences
argument of
importAme()
to append the sequence information to the AME results.
To download TSV data from the MEME Server, right-click the AME TSV output link
and "Save Target As" or "Save Link As" (see example image below), and save as
<filename>.tsv
. This file can be read using importAme()
.
memes is a wrapper for a select few tools from the MEME Suite, which were developed by another group. In addition to citing memes, please cite the MEME Suite tools corresponding to the tools you use.
If you use runAme()
in your analysis, please cite:
Robert McLeay and Timothy L. Bailey, "Motif Enrichment Analysis: A unified framework and method evaluation", BMC Bioinformatics, 11:165, 2010, doi:10.1186/1471-2105-11-165. full text
The MEME Suite is free for non-profit use, but for-profit users should purchase a license. See the MEME Suite Copyright Page for details.
sessionInfo()
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.