X-Git-Url: https://git.donarmstrong.com/?a=blobdiff_plain;f=R%2Face.R;h=b67549f9dccf4cd55b3d68b0fe5bd7ffb3f9ef8b;hb=80d1c453d63d6aec18f0b731d59918b99e189d86;hp=87ed1f2e60503d1e8de35d00ff94aafcd82582b6;hpb=d3e42fb930a0a07268080eb795ff696b4c8af67b;p=ape.git diff --git a/R/ace.R b/R/ace.R index 87ed1f2..b67549f 100644 --- a/R/ace.R +++ b/R/ace.R @@ -1,4 +1,4 @@ -## ace.R (2010-05-12) +## ace.R (2010-12-08) ## Ancestral Character Estimation @@ -12,7 +12,7 @@ ace <- function(x, phy, type = "continuous", method = "ML", CI = TRUE, scaled = TRUE, kappa = 1, corStruct = NULL, ip = 0.1) { if (!inherits(phy, "phylo")) - stop('object "phy" is not of class "phylo".') + stop('object "phy" is not of class "phylo".') if (is.null(phy$edge.length)) stop("tree has no branch lengths") type <- match.arg(type, c("continuous", "discrete")) @@ -25,8 +25,7 @@ ace <- function(x, phy, type = "continuous", method = "ML", CI = TRUE, if (!is.null(names(x))) { if(all(names(x) %in% phy$tip.label)) x <- x[phy$tip.label] - else warning('the names of argument "x" and the tip labels of the tree -did not match: the former were ignored in the analysis.') + else warning("the names of 'x' and the tip labels of the tree do not match: the former were ignored in the analysis.") } obj <- list() if (kappa != 1) phy$edge.length <- phy$edge.length^kappa @@ -164,7 +163,7 @@ as the number of categories in `x'") Q[] <- c(p, 0)[rate] diag(Q) <- -rowSums(Q) for (i in seq(from = 1, by = 2, length.out = nb.node)) { - j <- i + 1 + j <- i + 1L anc <- phy$edge[i, 1] des1 <- phy$edge[i, 2] des2 <- phy$edge[j, 2] @@ -175,7 +174,8 @@ as the number of categories in `x'") liks[anc, ] <- v/comp[anc] } if (output.liks) return(liks[-TIPS, ]) - -2 * sum(log(comp[-TIPS])) + dev <- -2 * sum(log(comp[-TIPS])) + if (is.na(dev)) Inf else dev } out <- nlminb(rep(ip, length.out = np), function(p) dev(p), lower = rep(0, np), upper = rep(1e50, np)) @@ -233,11 +233,12 @@ anova.ace <- function(object, ...) print.ace <- function(x, digits = 4, ...) { - cat("\n Ancestral Character Reconstruction\n\n") + cat("\n Ancestral Character Estimation\n\n") cat("Call: ") print(x$call) cat("\n") - cat(" Log-likelihood:", x$loglik, "\n\n") + if (!is.null(x$loglik)) + cat(" Log-likelihood:", x$loglik, "\n\n") ratemat <- x$index.matrix if (is.null(ratemat)) { # to be improved class(x) <- NULL @@ -253,7 +254,7 @@ print.ace <- function(x, digits = 4, ...) cat("Parameter estimates:\n") names(estim) <- c("rate index", "estimate", "std-err") print(estim, row.names = FALSE) - cat("\nScaled likelihoods at the root (type 'x$lik.anc' to get them for all nodes):\n") + cat("\nScaled likelihoods at the root (type '...$lik.anc' to get them for all nodes):\n") print(x$lik.anc[1, ]) } }