Skip to content

Commit

Permalink
Merge pull request #198 from nlmixr2/184-add-lotri-to-nlmixr2checkins…
Browse files Browse the repository at this point in the history
…tall

184 add lotri to nlmixr2checkinstall
  • Loading branch information
mattfidler committed Dec 19, 2023
2 parents 8cef5f0 + fe6570f commit 0c48e21
Show file tree
Hide file tree
Showing 18 changed files with 221 additions and 104 deletions.
2 changes: 2 additions & 0 deletions NAMESPACE
Expand Up @@ -60,6 +60,7 @@ export(rxCat)
export(rxClean)
export(rxControl)
export(rxDerived)
export(rxFun)
export(rxParam)
export(rxParams)
export(rxSetPipingAuto)
Expand Down Expand Up @@ -145,6 +146,7 @@ importFrom(rxode2,rxCat)
importFrom(rxode2,rxClean)
importFrom(rxode2,rxControl)
importFrom(rxode2,rxDerived)
importFrom(rxode2,rxFun)
importFrom(rxode2,rxParam)
importFrom(rxode2,rxParams)
importFrom(rxode2,rxSetPipingAuto)
Expand Down
5 changes: 3 additions & 2 deletions R/hardReexports.R
Expand Up @@ -11,9 +11,10 @@ traceplot <- function(x, ...) { # nocov start
#' @param ... Additional arguments passed to [nlmixr2est::vpcSim()].
#' @export
vpcSim <- function(object, ..., keep = NULL, n = 300, pred = FALSE,
seed = 1009, nretry = 50, normRelated = TRUE) { # nocov start
seed = 1009, nretry = 50, minN = 10, normRelated = TRUE) { # nocov start
nlmixr2est::vpcSim(object = object, ..., keep = keep, n = n,
pred = pred, seed = seed, nretry = nretry, normRelated = normRelated)
pred = pred, seed = seed, nretry = nretry, minN = minN,
normRelated = normRelated)
} # nocov end

#' @inherit nlmixr2plot::vpcPlot
Expand Down
30 changes: 23 additions & 7 deletions R/nlmixr2CheckInstall.R
@@ -1,21 +1,37 @@
.isLatex <- function ()
{
if (!("knitr" %in% loadedNamespaces())) {
return(FALSE)
}
get("is_latex_output", asNamespace("knitr"))()
}

.useUtf <- function() {
opt <- getOption("cli.unicode", NULL)
if (!is.null(opt)) {
isTRUE(opt)
}
else {
l10n_info()$`UTF-8` && !.isLatex()
}
}

#' Check your nlmixr2 installation for potential issues
#'
#' @examples
#' nlmixr2CheckInstall()
#' @export
nlmixr2CheckInstall <- function() {
# Setup functions for reporting back to the user

infoFun <- function(x) message(x, sep = "")
successFun <- function(x) message("\u2714", x, sep = "")
successFun <- function(x) message(ifelse(.useUtf(), "\u2714", "v"), x, sep = "")
warningFun <- function(x) message("! ", x, sep = "")
hasCli <- requireNamespace("cli")
hasCli <- requireNamespace("cli", quietly = TRUE)
if (hasCli) {
infoFun <- cli::cli_alert_info
successFun <- cli::cli_alert_success
warningFun <- cli::cli_alert_danger
}

sysInfo <- Sys.info()
osInfo <- sprintf("Operating system: %s %s %s", sysInfo["sysname"], sysInfo["release"], sysInfo["version"])
infoFun(osInfo)
Expand All @@ -41,9 +57,9 @@ nlmixr2CheckInstall <- function() {
}
pkgNames <-
list(
rxode2 = c("rxode2", "rxode2et", "rxode2parse", "rxode2ll", "rxode2random"),
nlmixr2 = c("nlmixr2", "nlmixr2est", "nlmixr2data"),
optional = c("nlmixr2lib", "nlmixr2extra", "babelmixr2")
rxode2 = c("rxode2", "rxode2et", "rxode2parse", "rxode2ll", "rxode2random", "lotri"),
nlmixr2 = c("nlmixr2", "nlmixr2est", "nlmixr2data", "nlmixr2extra", "nlmixr2plot"),
optional = c("nlmixr2lib", "nonmem2rx", "babelmixr2")
)
repos <- getOption("repos")
if ("@CRAN@" %in% repos) {
Expand Down
4 changes: 4 additions & 0 deletions R/reexports.R
Expand Up @@ -76,6 +76,10 @@ rxode2::add.dosing
#' @export
rxode2::add.sampling

#' @importFrom rxode2 rxFun
#' @export
rxode2::rxFun

#' @importFrom nlmixr2est nlmixr2AllEst
#' @export
nlmixr2est::nlmixr2AllEst
Expand Down
1 change: 1 addition & 0 deletions R/utils.R
Expand Up @@ -85,6 +85,7 @@
"rxode2::eventTable",
"rxode2::add.dosing",
"rxode2::add.sampling",
"rxode2::rxFun",
"nlmixr2est::nlmixr2AllEst",
"nlmixr2est::pdDiag",
"nlmixr2est::pdSymm",
Expand Down
9 changes: 9 additions & 0 deletions man/bootplot.Rd

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

87 changes: 78 additions & 9 deletions man/bootstrapFit.Rd

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

18 changes: 12 additions & 6 deletions man/covarSearchAuto.Rd

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

0 comments on commit 0c48e21

Please sign in to comment.