[Lme4-commits] r1670 - pkg/lme4/R

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Fri Mar 16 19:53:37 CET 2012


Author: dmbates
Date: 2012-03-16 19:53:36 +0100 (Fri, 16 Mar 2012)
New Revision: 1670

Modified:
   pkg/lme4/R/AllGeneric.R
   pkg/lme4/R/mcmcsamp.R
Log:
Disable the visibility of the mcmcsamp generic and method


Modified: pkg/lme4/R/AllGeneric.R
===================================================================
--- pkg/lme4/R/AllGeneric.R	2012-03-16 17:49:24 UTC (rev 1669)
+++ pkg/lme4/R/AllGeneric.R	2012-03-16 18:53:36 UTC (rev 1670)
@@ -18,16 +18,16 @@
     eval(mCall, parent.frame())
 }
 
-##' Create a Markov chain Monte Carlo sample from the posterior
-##' distribution of the parameters
-##'
-##' 
-##' @title Create an MCMC sample
-##' @param object a fitted model object
-##' @param n number of samples to generate.  Defaults to 1; for real use values of 200-1000 are more typical
-##' @param verbose should verbose output be given?
-##' @param ... additional, optional arguments (not used)
-##' @return a Markov chain Monte Carlo sample as a matrix
+## Create a Markov chain Monte Carlo sample from the posterior
+## distribution of the parameters
+##
+## 
+## @title Create an MCMC sample
+## @param object a fitted model object
+## @param n number of samples to generate.  Defaults to 1; for real use values of 200-1000 are more typical
+## @param verbose should verbose output be given?
+## @param ... additional, optional arguments (not used)
+## @return a Markov chain Monte Carlo sample as a matrix
 mcmcsamp <- function(object, n = 1L, verbose = FALSE, ...) UseMethod("mcmcsamp")
 
 ##' Extract the residual standard error from a fitted model.
@@ -84,9 +84,3 @@
 setGeneric("HPDinterval",
            function(object, prob = 0.95, ...) standardGeneric("HPDinterval"))
 }
-
-if (FALSE) {
-setGeneric("mcmcsamp",
-           function(object, n = 1, verbose = FALSE, ...)
-           standardGeneric("mcmcsamp"))
-}

Modified: pkg/lme4/R/mcmcsamp.R
===================================================================
--- pkg/lme4/R/mcmcsamp.R	2012-03-16 17:49:24 UTC (rev 1669)
+++ pkg/lme4/R/mcmcsamp.R	2012-03-16 18:53:36 UTC (rev 1670)
@@ -1,4 +1,4 @@
-#' @S3method mcmcsamp merMod
+# @S3method mcmcsamp merMod
 mcmcsamp.merMod <- function(object, n=1L, verbose=FALSE, saveb=FALSE, ...) {
     n <- max(1L, as.integer(n)[1])
     dd <- getME(object, "devcomp")$dims
@@ -12,7 +12,7 @@
     ## FIXME create a copy of the resp and pred modules
     ans <- new("merMCMC",
                Gp = object at Gp,
-               ST = matrix(.Call(mer_ST_getPars, object), dd[["np"]], n),
+ #              ST = matrix(.Call(mer_ST_getPars, object), dd[["np"]], n),
                call = object at call,
                dims = object at dims,
                deviance = rep.int(unname(object at deviance[["ML"]]), n),



More information about the Lme4-commits mailing list