[Lme4-commits] r1800 - pkg/lme4.0/R

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Fri Apr 5 23:01:58 CEST 2013


Author: bbolker
Date: 2013-04-05 23:01:58 +0200 (Fri, 05 Apr 2013)
New Revision: 1800

Modified:
   pkg/lme4.0/R/lmList.R
   pkg/lme4.0/R/lmer.R
Log:
full argument names



Modified: pkg/lme4.0/R/lmList.R
===================================================================
--- pkg/lme4.0/R/lmList.R	2013-03-06 21:54:25 UTC (rev 1799)
+++ pkg/lme4.0/R/lmList.R	2013-04-05 21:01:58 UTC (rev 1800)
@@ -198,8 +198,8 @@
                            ordered(rep(dn[[1]], dd[2] * dd[3]),
                                    levels = levs),
                            intervals = as.vector(arr),
-                           what = gl(dd[3], dd[1] * dd[2], len = ll, lab = dn[[3]]),
-                           end = gl(dd[2], dd[1], len = ll))
+                           what = gl(dd[3], dd[1] * dd[2], length = ll, labels = dn[[3]]),
+                           end = gl(dd[2], dd[1], length = ll))
           strip <- dots[["strip"]]
           if (is.null(strip)) {
               strip <- function(...) strip.default(..., style = 1)

Modified: pkg/lme4.0/R/lmer.R
===================================================================
--- pkg/lme4.0/R/lmer.R	2013-03-06 21:54:25 UTC (rev 1799)
+++ pkg/lme4.0/R/lmer.R	2013-04-05 21:01:58 UTC (rev 1800)
@@ -1052,7 +1052,7 @@
 				logLik = llk,
 				"Chisq" = chisq,
 				"Chi Df" = dfChisq,
-				"Pr(>Chisq)" = pchisq(chisq, dfChisq, lower = FALSE),
+				"Pr(>Chisq)" = pchisq(chisq, dfChisq, lower.tail = FALSE),
 				row.names = names(mods), check.names = FALSE)
 	      class(val) <- c("anova", class(val))
               attr(val, "heading") <-
@@ -1439,7 +1439,7 @@
               if (!dims[["useSc"]]) {
                   coefs <- coefs[, 1:2, drop = FALSE]
                   stat <- coefs[,1]/coefs[,2]
-                  pval <- 2*pnorm(abs(stat), lower = FALSE)
+                  pval <- 2*pnorm(abs(stat), lower.tail = FALSE)
                   coefs <- cbind(coefs, "z value" = stat, "Pr(>|z|)" = pval)
               } else {
                   stat <- coefs[,1]/coefs[,2]



More information about the Lme4-commits mailing list