aboutsummaryrefslogtreecommitdiff
diff options
context:
space:
mode:
authorJohannes Ranke <jranke@uni-bremen.de>2020-07-20 21:02:28 +0200
committerJohannes Ranke <jranke@uni-bremen.de>2020-07-20 21:02:28 +0200
commit2f492ce2acf21610a7b15ce5d1878cf0f2ae5b4d (patch)
tree260868f30b78b3b449c4c901e617452029708a37
parenta7e209b553e2e99ffc9aa2b003f9b73b9ac4b985 (diff)
Require upcoming nlme version, remove anova.nlme.mmkin
The method is no longer necessary, now that Bug 17761 is fixed upstream https://bugs.r-project.org/bugzilla/show_bug.cgi?id=17761
-rw-r--r--DESCRIPTION2
-rw-r--r--NAMESPACE1
-rw-r--r--R/nlme.mmkin.R29
3 files changed, 1 insertions, 31 deletions
diff --git a/DESCRIPTION b/DESCRIPTION
index 41f90f42..493f3532 100644
--- a/DESCRIPTION
+++ b/DESCRIPTION
@@ -17,7 +17,7 @@ Description: Calculation routines based on the FOCUS Kinetics Report (2006,
note that no warranty is implied for correctness of results or fitness for a
particular purpose.
Imports: stats, graphics, methods, deSolve, R6, inline, parallel, numDeriv,
- lmtest, pkgbuild, nlme, purrr, saemix (>= 3.1.9000)
+ lmtest, pkgbuild, nlme (>= 3.1-149), purrr, saemix (>= 3.1.9000)
Suggests: knitr, rbenchmark, tikzDevice, testthat, rmarkdown, covr, vdiffr,
benchmarkme, tibble, stats4
License: GPL
diff --git a/NAMESPACE b/NAMESPACE
index 0330f88f..0a04d6c3 100644
--- a/NAMESPACE
+++ b/NAMESPACE
@@ -3,7 +3,6 @@
S3method("[",mmkin)
S3method(AIC,mmkin)
S3method(BIC,mmkin)
-S3method(anova,nlme.mmkin)
S3method(aw,mkinfit)
S3method(aw,mmkin)
S3method(confint,mkinfit)
diff --git a/R/nlme.mmkin.R b/R/nlme.mmkin.R
index fdf64fbf..a94a26f7 100644
--- a/R/nlme.mmkin.R
+++ b/R/nlme.mmkin.R
@@ -170,32 +170,3 @@ update.nlme.mmkin <- function(object, ...) {
class(res) <- c("nlme.mmkin", "nlme", "lme")
return(res)
}
-
-# The following is necessary as long as R bug 17761 is not fixed
-# https://bugs.r-project.org/bugzilla/show_bug.cgi?id=17761
-#' @export
-anova.nlme.mmkin <- function(object, ...) {
- thisCall <- as.list(match.call())[-1]
- object_name <- as.character(thisCall[[1]])
- other_object_names <- sapply(thisCall[-1], as.character)
-
- remove_class <- function(object, classname) {
- old_class <- class(object)
- class(object) <- setdiff(old_class, classname)
- return(object)
- }
- object <- remove_class(object, "nlme.mmkin")
- other_objects <- list(...)
- other_objects <- lapply(other_objects, remove_class, "nlme.mmkin")
-
- env <- new.env()
- assign(object_name, object, env)
- for (i in seq_along(other_objects)) {
- assign(other_object_names[i], other_objects[[i]], env)
- }
- res <- eval(parse(text = paste0("anova.lme(", object_name, ", ",
- paste(other_object_names, collapse = ", "), ")")),
- envir = env)
-
- return(res)
-}

Contact - Imprint