Monday, May 8, 2017

Comparing the node heights of different trees that share a topology & are not necessarily ultrametric

I recently posted some simple code to visually compare the node heights of two alternative time-trees with the same topology but different edge lengths.

The following function extends this to the more general case in which the trees are identical in topology but are not necessarily ultrametric. This would work for time-trees in which some of the tips terminate before the present (i.e., they represent extinct lineages), or for any tree that is not ultrametric.

First, here is the function:

compare.chronograms<-function(t1,t2,...){
    if(hasArg(colors)) colors<-list(...)$colors
    else colors<-sapply(c("blue","red"),make.transparent,alpha=0.4)
    if(hasArg(arr.colors)) arr.colors<-list(...)$arr.colors
    else arr.colors<-sapply(c("blue","red"),make.transparent,alpha=0.7)
    h1<-sapply(1:Ntip(t1),nodeheight,tree=t1)
    h2<-sapply(1:Ntip(t2),nodeheight,tree=t2)
    plotTree(if(max(h1)>max(h2)) t1 else t2,plot=FALSE,
        mar=c(4.1,1.1,1.1,1.1),direction="leftwards")
    xlim<-get("last_plot.phylo",envir=.PlotPhyloEnv)$x.lim[2:1]
    par(fg="transparent")
    plotTree(t1,color=colors[1],mar=c(4.1,1.1,1.1,1.1),
        xlim=xlim,direction="leftwards",lwd=3)
    T1<-get("last_plot.phylo",envir=.PlotPhyloEnv)
    par(fg="black")
    axis(1)
    par(fg="transparent")
    plotTree(t2,color=colors[2],mar=c(4.1,1.1,1.1,1.1),
        xlim=xlim,add=TRUE,direction="leftwards",ftype="off",lwd=3)
    T2<-get("last_plot.phylo",envir=.PlotPhyloEnv)
    par(fg="black")
    for(i in 1:t1$Nnode+Ntip(t1)){
        arrows(T1$xx[i],T1$yy[i],T2$xx[i],T2$yy[i],lwd=2,
            col=if(T1$xx[i]>T2$xx[i]) arr.colors[2] else arr.colors[1],
            length=0.1)
    }
    h<-mapply(function(x,y) if(x<y) x else y,x=T1$xx[1:Ntip(t1)],
        y=T2$xx[1:Ntip(t2)])
    text(rep(min(h),Ntip(t1)),T1$yy[1:Ntip(t1)],
        labels=t1$tip.label,font=3,pos=4,offset=0.1*max(c(h1,h2)))
    for(i in 1:Ntip(t1)) lines(c(h[i]+
        if(h[i]>min(h)) 0.005*diff(xlim) else 0,min(h)),
        rep(T1$yy[i],2),lty="dotted")   
}

Now we apply it to a simulated case:

compare.chronograms(t1,t2)

plot of chunk unnamed-chunk-2

BTW, the trees in this example were simulated as follows:

tree<-rtree(n=26,tip.label=LETTERS)
t1<-force.ultrametric(tree,"nnls")
tree$edge.length<-runif(n=nrow(tree$edge))
t2<-force.ultrametric(tree,"nnls")
rm(tree)
t1$edge.length<-t1$edge.length*runif(n=nrow(t1$edge),min=0.8,max=1)
t2$edge.length<-t2$edge.length*runif(n=nrow(t2$edge),min=0.8,max=1)

No comments:

Post a Comment

Note: due to the very large amount of spam, all comments are now automatically submitted for moderation.