X-Git-Url: https://git.donarmstrong.com/?a=blobdiff_plain;f=R%2FrTrait.R;h=1b5852d102024a01a9a1a312643e82f57f9c0d76;hb=5090ae602c33e1cd3bbdbd2429a43daa8188b8c3;hp=b87dd6f8a60ff023271acfb1339c36fdc53d190e;hpb=821974300c3d4c88584832e3f4b2c99ed56601cb;p=ape.git diff --git a/R/rTrait.R b/R/rTrait.R index b87dd6f..1b5852d 100644 --- a/R/rTrait.R +++ b/R/rTrait.R @@ -1,8 +1,8 @@ -## rTrait.R (2010-12-24) +## rTrait.R (2012-02-09) ## Trait Evolution -## Copyright 2010 Emmanuel Paradis +## Copyright 2010-2012 Emmanuel Paradis ## This file is part of the R-package `ape'. ## See the file ../COPYING for licensing issues. @@ -64,7 +64,7 @@ rTraitDisc <- diag(Q) <- -rowSums(Q) for (i in N:1) { p <- matexpo(Q * el[i])[x[anc[i]], ] - x[des[i]] <- .Internal(sample(k, size = 1, FALSE, prob = p)) + x[des[i]] <- sample.int(k, size = 1, FALSE, prob = p) } } @@ -82,7 +82,7 @@ rTraitDisc <- rTraitCont <- function(phy, model = "BM", sigma = 0.1, alpha = 1, theta = 0, - ancestor = FALSE, root.value = 0, linear = TRUE, ...) + ancestor = FALSE, root.value = 0, ...) { if (is.null(phy$edge.length)) stop("tree has no branch length") @@ -115,9 +115,11 @@ rTraitCont <- if (length(theta) == 1) theta <- rep(theta, N) else if (length(theta) != N) stop("'theta' must have one or Nedge(phy) elements") - if (!linear) model <- model + 1L } - .C("rTraitCont", as.integer(model), as.integer(N), as.integer(anc - 1L), as.integer(des - 1L), el, sigma, alpha, theta, x, DUP = FALSE, NAOK = TRUE, PACKAGE = "ape") + .C("rTraitCont", as.integer(model), as.integer(N), + as.integer(anc - 1L), as.integer(des - 1L), el, + as.double(sigma), as.double(alpha), as.double(theta), x, + DUP = FALSE, NAOK = TRUE, PACKAGE = "ape") } if (ancestor) { @@ -129,3 +131,44 @@ rTraitCont <- } x } + +rTraitMult <- + function(phy, model, p = 1, root.value = rep(0, p), ancestor = FALSE, + asFactor = NULL, trait.labels = paste("x", 1:p, sep = ""), ...) +{ + phy <- reorder(phy, "pruningwise") + n <- length(phy$tip.label) + m <- phy$Nnode + N <- dim(phy$edge)[1] + ROOT <- n + 1L + + x <- matrix(0, n + m, p) + x[ROOT, ] <- root.value + + anc <- phy$edge[, 1] + des <- phy$edge[, 2] + + el <- phy$edge.length + if (is.null(el)) el <- numeric(N) + + environment(model) <- environment() # to find 'p' + + for (i in N:1) x[des[i], ] <- model(x[anc[i], ], el[i], ...) + + if (ancestor) { + if (is.null(phy$node.label)) phy <- makeNodeLabel(phy) + rownames(x) <- c(phy$tip.label, phy$node.label) + } else { + x <- x[1:n, , drop = FALSE] + rownames(x) <- phy$tip.label + } + x <- as.data.frame(x) + names(x) <- trait.labels + if (!is.null(asFactor)) { + for (i in asFactor) { + y <- x[, i] + x[, i] <- factor(y, labels = LETTERS[1:length(unique(y))]) + } + } + x +}