aboutsummaryrefslogtreecommitdiff
path: root/R/twa.R
diff options
context:
space:
mode:
authorJohannes Ranke <jranke@uni-bremen.de>2017-01-19 09:20:22 +0100
committerJohannes Ranke <jranke@uni-bremen.de>2017-01-19 09:20:22 +0100
commita6d61c06d573574cf574ed893cc13808a9e8b785 (patch)
tree6ff3587e1445ed57861f22cb7074257238366a0f /R/twa.R
parentb8ac1393b9e1bef8c48b26b790cf5759ccd69fed (diff)
Fix order of arguments to one_box, correct docs
Diffstat (limited to 'R/twa.R')
-rw-r--r--R/twa.R15
1 files changed, 8 insertions, 7 deletions
diff --git a/R/twa.R b/R/twa.R
index e3c0076..c936805 100644
--- a/R/twa.R
+++ b/R/twa.R
@@ -44,16 +44,16 @@
#' fit_2 <- mkinfit(m_2, FOCUS_2006_D, quiet = TRUE)
#' pred_2 <- one_box(fit_2)
#' plot(pred_2)
-one_box <- function(x,
- t_end = 100, res = 0.01, ...)
+one_box <- function(x, ...,
+ t_end = 100, res = 0.01)
{
UseMethod("one_box")
}
#' @rdname one_box
#' @export
-one_box.numeric <- function(x,
- t_end = 100, res = 0.01, ...)
+one_box.numeric <- function(x, ...,
+ t_end = 100, res = 0.01)
{
half_life = x
k = log(2)/half_life
@@ -68,8 +68,8 @@ one_box.numeric <- function(x,
#' @rdname one_box
#' @param parms A named numeric vector containing the model parameters
#' @export
-one_box.character <- function(x, parms,
- t_end = 100, res = 0.01, ...)
+one_box.character <- function(x, parms, ...,
+ t_end = 100, res = 0.01)
{
parent_models_available = c("SFO", "FOMC", "DFOP", "HS", "SFORB", "IORE")
if (length(x) == 1 & x %in% parent_models_available) {
@@ -96,7 +96,7 @@ one_box.character <- function(x, parms,
#' @rdname one_box
#' @importFrom mkin mkinpredict
#' @export
-one_box.mkinfit <- function(x, t_end = 100, res = 0.01, ...) {
+one_box.mkinfit <- function(x, ..., t_end = 100, res = 0.01) {
fit <- x
t_out = seq(0, t_end, by = res)
odeini <- c(1, rep(0, length(fit$mkinmod$spec) - 1))
@@ -134,6 +134,7 @@ one_box.mkinfit <- function(x, t_end = 100, res = 0.01, ...) {
#' # Use a fitted mkinfit model
#' m_2 <- mkinmod(parent = mkinsub("SFO", "m1"), m1 = mkinsub("SFO"))
#' fit_2 <- mkinfit(m_2, FOCUS_2006_D, quiet = TRUE)
+#' pred_2 <- one_box(fit_2)
#' pred_2_saw <- sawtooth(pred_2, 2, 7)
#' plot(pred_2_saw, max_twa = 21, max_twa_var = "m1")
plot.one_box <- function(x,

Contact - Imprint