[Lme4-commits] r1523 - branches/roxygen/R
noreply at r-forge.r-project.org
noreply at r-forge.r-project.org
Thu Jan 26 22:53:02 CET 2012
Author: dmbates
Date: 2012-01-26 22:53:02 +0100 (Thu, 26 Jan 2012)
New Revision: 1523
Modified:
branches/roxygen/R/lmer.R
Log:
Switch to importing minqa::bobyqa only instead of depending on the whole package.
Modified: branches/roxygen/R/lmer.R
===================================================================
--- branches/roxygen/R/lmer.R 2012-01-26 21:52:00 UTC (rev 1522)
+++ branches/roxygen/R/lmer.R 2012-01-26 21:53:02 UTC (rev 1523)
@@ -82,6 +82,7 @@
##' all.equal(sigma(fm3.d),sigma(fm3.s), tol = 1e-14),
##' TRUE)
##' @export
+##' @importFrom minqa bobyqa
lmer <- function(formula, data, REML = TRUE, sparseX = FALSE,
control = list(), start = NULL,
verbose = 0L, subset, weights, na.action, offset,
@@ -605,7 +606,7 @@
##'
##' (dd <- lmer(Yield ~ 1|Batch, Dyestuff, devFunOnly=TRUE))
##' dd(0.8)
-##' bobyqa(1, dd, 0)
+##' minqa::bobyqa(1, dd, 0)
##'
mkdevfun <- function(rho, nAGQ=1L) {
stopifnot(is.environment(rho), is(rho$resp, "lmResp"))
@@ -1409,7 +1410,7 @@
##' @examples
##'
##' ## shows many methds you should consider *before* getME():
-##' showMethods(class = "merMod")
+##' methods(class = "merMod")
##'
##' (fm1 <- lmer(Reaction ~ Days + (Days|Subject), sleepstudy))
##' Z <- getME(fm1, "Z")
More information about the Lme4-commits
mailing list