Skip to content

Commit

Permalink
Remove unused maxpts argument
Browse files Browse the repository at this point in the history
  • Loading branch information
billdenney committed Aug 19, 2024
1 parent 5159186 commit 98805e1
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 13 deletions.
10 changes: 2 additions & 8 deletions R/profile.R
Original file line number Diff line number Diff line change
Expand Up @@ -8,9 +8,6 @@
#' @param ... ignored
#' @param which The parameter names to perform likelihood profiling on
#' (`NULL` indicates all parameters)
#' @param maxpts The maximum number of fits to perform in each direction (higher
#' or lower values) for each parameter. The total maximum number of estimates
#' that may be performed is `maxpts*2*length(which)`.
#' @param ofvIncrease The targetted change in objective function value (3.84
#' corresponds to a Chi-squared test with a 95% confidence interval)
#' @param normQuantile The quantile of a normal distribution to use for the
Expand All @@ -36,7 +33,7 @@
#' @family Profiling
#' @export
profile.nlmixr2FitCore <- function(fitted, ...,
which = NULL, maxpts = 10,
which = NULL,
ofvIncrease = qchisq(0.95, df = 1),
normQuantile = qnorm(p = 0.975),
rseTheta,
Expand All @@ -58,7 +55,6 @@ profile.nlmixr2FitCore <- function(fitted, ...,
# setOfv(currentFit, fittedOfvType)
# logLik(currentFit)

checkmate::assert_integerish(maxpts, lower = 1, any.missing = FALSE, len = 1)
checkmate::assert_number(ofvIncrease, lower = 0, finite = TRUE, null.ok = FALSE, na.ok = FALSE)
checkmate::assert_integerish(paramDigits, lower = 1, upper = 10, any.missing = FALSE, len = 1, null.ok = FALSE, coerce = TRUE)
if (missing(rseTheta)) {
Expand Down Expand Up @@ -92,12 +88,10 @@ profile.nlmixr2FitCore <- function(fitted, ...,
fitted = fitted,
...,
which = currentWhich,
maxpts = maxpts,
ofvIncrease = ofvIncrease,
normQuantile = normQuantile,
rseTheta = rseTheta,
ofvtol = ofvtol,
optimControl = optimControl
ofvtol = ofvtol
)
)
}
Expand Down
5 changes: 0 additions & 5 deletions man/profile.nlmixr2FitCore.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 98805e1

Please sign in to comment.