Introduction
These notes describe the ancestral sequence reconstruction using the phangorn package (Schliep 2011). phangorn provides several methods to estimate ancestral character states with either Maximum Parsimony (MP) or Maximum Likelihood (ML). For more background on all the methods see e.g. (Felsenstein 2004) or (Yang 2006).
Parsimony reconstructions
To reconstruct ancestral sequences we first load some data and reconstruct a tree:
library(phangorn)
<- system.file("extdata/trees", package = "phangorn")
fdir <- read.phyDat(file.path(fdir, "primates.dna"),
primates format = "interleaved")
<- pratchet(primates, trace=0) |> acctran(primates)
tree parsimony(tree, primates)
## [1] 746
For parsimony analysis of the edge length represent the observed number of changes. Reconstructing ancestral states therefore defines also the edge lengths of a tree. However there can exist several equally parsimonious reconstructions or states can be ambiguous and therefore edge length can differ. “MPR” reconstructs the ancestral states for each (internal) node as if the tree would be rooted in that node. However the nodes are not independent of each other. If one chooses one state for a specific node, this can restrict the choice of neighboring nodes (figures 2 and 3). The function acctran (accelerated transformation) assigns edge length and internal nodes to the tree (Swofford and Maddison 1987).
<- ancestral.pars(tree, primates, "ACCTRAN")
anc.acctran <- ancestral.pars(tree, primates, "MPR") anc.mpr
All the ancestral reconstructions for parsimony are based on the
fitch algorithm and so far only bifurcating trees are allowed. However
trees can get pruned afterwards using the function multi2di
from ape.
The seqLogo
function from the seqLogo package
from Bioconductor provides a neat way to show proportions of a
nucleotides of ancestral states (see figure 1).
library(seqLogo)
seqLogo( t(subset(anc.mpr, getRoot(tree), 1:20)[[1]]), ic.scale=FALSE)
You may need to install seqLogo before
if (!requireNamespace("BiocManager", quietly = TRUE))
install.packages("BiocManager")
::install("seqLogo") BiocManager
plotAnc(tree, anc.mpr, 17)
title("MPR")
plotAnc(tree, anc.acctran, 17)
title("ACCTRAN")
Likelihood reconstructions
phangorn also offers the possibility to estimate ancestral states using a ML. The advantages of ML over parsimony is that the reconstruction accounts for different edge lengths. So far only a marginal construction is implemented (see (Yang 2006)).
<- pml(tree, primates)
fit <- optim.pml(fit, model="F81", control = pml.control(trace=0)) fit
We can assign the ancestral states according to the highest likelihood (“ml”): \[ P(x_r = A) = \frac{L(x_r=A)}{\sum_{k \in \{A,C,G,T\}}L(x_r=k)} \] and the highest posterior probability (“bayes”) criterion: \[ P(x_r=A) = \frac{\pi_A L(x_r=A)}{\sum_{k \in \{A,C,G,T\}}\pi_k L(x_r=k)}, \] where \(L(x_r)\) is the joint probability of states at the tips and the state at the root \(x_r\) and \(\pi_i\) are the estimated base frequencies of state \(i\). Both methods agree if all states (base frequencies) have equal probabilities.
<- ancestral.pml(fit, "ml")
anc.ml <- ancestral.pml(fit, "bayes") anc.bayes
The differences of the two approaches for a specific site (17) are represented in the following figures.
plotAnc(tree, anc.ml, 17)
title("ML")
plotAnc(tree, anc.bayes, 17)
title("Bayes")
Session info
## R version 4.2.0 (2022-04-22)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 22.04 LTS
##
## Matrix products: default
## BLAS: /usr/lib/x86_64-linux-gnu/openblas-pthread/libblas.so.3
## LAPACK: /usr/lib/x86_64-linux-gnu/openblas-pthread/libopenblasp-r0.3.20.so
##
## locale:
## [1] LC_CTYPE=de_AT.UTF-8 LC_NUMERIC=C
## [3] LC_TIME=de_AT.UTF-8 LC_COLLATE=C
## [5] LC_MONETARY=de_AT.UTF-8 LC_MESSAGES=de_AT.UTF-8
## [7] LC_PAPER=de_AT.UTF-8 LC_NAME=C
## [9] LC_ADDRESS=C LC_TELEPHONE=C
## [11] LC_MEASUREMENT=de_AT.UTF-8 LC_IDENTIFICATION=C
##
## attached base packages:
## [1] stats graphics grDevices utils datasets methods base
##
## other attached packages:
## [1] phangorn_2.9.0 ape_5.6-2
##
## loaded via a namespace (and not attached):
## [1] igraph_1.3.1 Rcpp_1.0.8.3 rstudioapi_0.13 knitr_1.39
## [5] magrittr_2.0.3 lattice_0.20-45 R6_2.5.1 quadprog_1.5-8
## [9] rlang_1.0.2 fastmatch_1.1-3 fastmap_1.1.0 highr_0.9
## [13] stringr_1.4.0 tools_4.2.0 parallel_4.2.0 grid_4.2.0
## [17] nlme_3.1-157 xfun_0.31 cli_3.3.0 jquerylib_0.1.4
## [21] htmltools_0.5.2 yaml_2.3.5 digest_0.6.29 Matrix_1.4-1
## [25] codetools_0.2-18 sass_0.4.1 prettydoc_0.4.1 evaluate_0.15
## [29] rmarkdown_2.14 stringi_1.7.6 compiler_4.2.0 bslib_0.3.1
## [33] generics_0.1.2 jsonlite_1.8.0 pkgconfig_2.0.3