diff --git a/NEWS.md b/NEWS.md index 104861cd..d9669e33 100644 --- a/NEWS.md +++ b/NEWS.md @@ -21,6 +21,7 @@ the dosing including dose amount and route. * `PKNCAdata()` is more restrictive on unknown arguments issuing an error when unknonwn arguments are present. * `intervals` argument to `PKNCAdata()` may now be a tibble (fixes #72). +* Documentation has been extensively updated (fixes #81). # PKNCA 0.8.5 diff --git a/R/001-add.interval.col.R b/R/001-add.interval.col.R index 0a918d81..e9ad1cca 100644 --- a/R/001-add.interval.col.R +++ b/R/001-add.interval.col.R @@ -71,6 +71,7 @@ assign("interval.cols", list(), envir=.PKNCAEnv) #' depends=c("cmax")) #' } #' @importFrom utils getAnywhere +#' @family Interval specifications #' @export add.interval.col <- function(name, FUN, @@ -186,6 +187,7 @@ sort.interval.cols <- function() { #' Calculation Intervals" #' @examples #' get.interval.cols() +#' @family Interval specifications #' @export get.interval.cols <- function() { sort.interval.cols() diff --git a/R/002-pk.business.rules.R b/R/002-pk.business.rules.R index 31b96223..092a1602 100644 --- a/R/002-pk.business.rules.R +++ b/R/002-pk.business.rules.R @@ -54,12 +54,14 @@ geomean <- function(x, na.rm=FALSE) { } } -#' @describeIn geomean Compute the geometric standard deviation. +#' @describeIn geomean Compute the geometric standard deviation, +#' \code{exp(sd(log(x)))}. #' @export geosd <- function(x, na.rm=FALSE) exp(stats::sd(log(x), na.rm=na.rm)) -#' @describeIn geomean Compute the geometric coefficient of variation. +#' @describeIn geomean Compute the geometric coefficient of variation, +#' \code{sqrt(exp(sd(log(x))^2)-1)*100}. #' @export geocv <- function(x, na.rm=FALSE) sqrt(exp(stats::sd(log(x), na.rm=na.rm)^2)-1)*100 diff --git a/R/PKNCA.options.R b/R/PKNCA.options.R index 2cfd73e1..b21b00d1 100644 --- a/R/PKNCA.options.R +++ b/R/PKNCA.options.R @@ -311,7 +311,7 @@ #' \item{a single value is requested}{the current value of that option is returned as a scalar} #' \item{multiple values are requested}{the current values of those options are returned as a list} #' } -#' @seealso \code{\link{PKNCA.choose.option}} +#' @family PKNCA calculation and summary settings #' @examples #' #' PKNCA.options() @@ -404,7 +404,7 @@ PKNCA.options <- function(..., default=FALSE, check=FALSE, name, value) { #' @param options The non-default options to choose from. #' @return The value of the option first from the \code{options} list and if it #' is not there then from the current settings. -#' @seealso \code{\link{PKNCA.options}} +#' @family PKNCA calculation and summary settings #' @export PKNCA.choose.option <- function(name, value=NULL, options=list()) if (!is.null(value)) { @@ -446,6 +446,7 @@ PKNCA.options.describe <- function(name) { #' @param reset Reset all the summary instructions #' @return All current summary settings (invisibly) #' @seealso \code{\link{summary.PKNCAresults}} +#' @family PKNCA calculation and summary settings #' @export PKNCA.set.summary <- function(name, point, spread, rounding=list(signif=3), reset=FALSE) { diff --git a/R/auc.R b/R/auc.R index 6893344a..9d87a5aa 100644 --- a/R/auc.R +++ b/R/auc.R @@ -45,8 +45,8 @@ #' passed to \code{pk.calc.auxc} #' @return A numeric value for the AU(M)C #' @aliases pk.calc.auc pk.calc.aumc pk.calc.auc.last -#' @seealso \code{\link{pk.calc.auc.all}}, \code{\link{pk.calc.auc.last}}, -#' \code{\link{clean.conc.blq}} +#' @family AUC calculations +#' @seealso \code{\link{clean.conc.blq}} #' @references #' #' Gabrielsson J, Weiner D. "Section 2.8.1 Computation methods - Linear diff --git a/R/aucint.R b/R/aucint.R index 6f0d06e6..db2381a6 100644 --- a/R/aucint.R +++ b/R/aucint.R @@ -29,8 +29,8 @@ #' \code{interp.extrap.conc} #' @param options List of changes to the default #' \code{\link{PKNCA.options}} for calculations. -#' @seealso \code{\link{pk.calc.auxc}}, \code{\link{PKNCA.options}}, -#' \code{\link{interp.extrap.conc.dose}} +#' @family AUC calculations +#' @seealso \code{\link{PKNCA.options}}, \code{\link{interp.extrap.conc.dose}} #' @export pk.calc.aucint <- function(conc, time, interval=NULL, start=NULL, end=NULL, diff --git a/R/check.intervals.R b/R/check.intervals.R index bb1b8052..7404ff28 100644 --- a/R/check.intervals.R +++ b/R/check.intervals.R @@ -16,14 +16,13 @@ #' @return x The potentially updated data frame with the interval #' calculation specification. #' -#' @seealso \code{\link{check.interval.deps}}, \code{\link{get.parameter.deps}}, -#' \code{\link{get.interval.cols}}, and the vignette "Selection of Calculation -#' Intervals" +#' @family Interval specifications +#' @seealso The vignette "Selection of Calculation Intervals" #' @export check.interval.specification <- function(x) { if (!is.data.frame(x)) { - ## Just a warning and let as.data.frame make it an error if - ## it can't be coerced. + # Just a warning and let as.data.frame make it an error if it can't be + # coerced. warning("Interval specification must be a data.frame") x <- as.data.frame(x, stringsAsFactors=FALSE) } @@ -94,6 +93,7 @@ check.interval.specification <- function(x) { #' @return A character vector of parameter names that depend on the #' parameter \code{x}. If none depend on \code{x}, then the result #' will be an empty vector. +#' @family Interval specifications #' @export get.parameter.deps <- function(x) { all.intervals <- get.interval.cols() @@ -166,15 +166,15 @@ get.parameter.deps <- function(x) { #' @param x A data frame with one or morw rows of the PKNCA interval #' @return The interval specification with additional calculations #' added where requested outputs require them. -#' @seealso \code{\link{check.interval.specification}} +#' @family Interval specifications check.interval.deps <- function(x) { - ## Ensure that the input is a valid interval specification + # Ensure that the input is a valid interval specification ret <- check.interval.specification(x) colspec <- get.interval.cols() for (n in names(colspec)) { if (is.logical(ret[,n])) { - ## This is a calculation to complete, otherwise it's something - ## informative but not caluclated. + # This is a calculation to complete, otherwise it's something informative + # but not caluclated. mask.calculated <- ret[,n] for (deps in colspec[[n]]$depends) ret[,deps] <- mask.calculated | ret[,deps] diff --git a/R/choose.intervals.R b/R/choose.intervals.R index a4498644..bce7afb5 100644 --- a/R/choose.intervals.R +++ b/R/choose.intervals.R @@ -23,9 +23,10 @@ #' \code{auc.type}, and \code{half.life}. See #' \code{\link{check.interval.specification}} for column definitions. #' The data frame may have zero rows if no intervals could be found. +#' @family Interval specifications +#' @family Interval determination #' @seealso \code{\link{pk.calc.auc}}, \code{\link{pk.calc.aumc}}, -#' \code{\link{pk.calc.half.life}}, \code{\link{find.tau}}, -#' \code{\link{check.interval.specification}}, \code{\link{PKNCA.options}} +#' \code{\link{pk.calc.half.life}}, \code{\link{PKNCA.options}} #' @export choose.auc.intervals <- function(time.conc, time.dosing, options=list(), @@ -126,6 +127,7 @@ choose.auc.intervals <- function(time.conc, time.dosing, #' \item If none of the \code{choices} can minimize the number of #' unique values, then -1 is returned. #' } +#' @family Interval determination #' @export find.tau <- function(x, na.action=na.omit, options=list(), diff --git a/R/class-PKNCAconc.R b/R/class-PKNCAconc.R index a19d611e..68062fd9 100644 --- a/R/class-PKNCAconc.R +++ b/R/class-PKNCAconc.R @@ -34,7 +34,7 @@ #' those points and bypassing automatic point selection). #' @param ... Ignored. #' @return A PKNCAconc object that can be used for automated NCA. -#' @seealso \code{\link{PKNCAdata}}, \code{\link{PKNCAdose}} +#' @family PKNCA objects #' @export PKNCAconc <- function(data, ...) UseMethod("PKNCAconc") diff --git a/R/class-PKNCAdata.R b/R/class-PKNCAdata.R index 466fb094..9552be0d 100644 --- a/R/class-PKNCAdata.R +++ b/R/class-PKNCAdata.R @@ -28,8 +28,8 @@ #' @details If \code{data.dose} is not given or is \code{NA}, then the #' \code{intervals} must be given. At least one of \code{data.dose} #' and \code{intervals} must be given. -#' @seealso \code{\link{PKNCAconc}}, \code{\link{PKNCAdose}}, -#' \code{\link{choose.auc.intervals}}, \code{\link{pk.nca}} +#' @family PKNCA objects +#' @seealso \code{\link{choose.auc.intervals}}, \code{\link{pk.nca}} #' @export PKNCAdata <- function(data.conc, data.dose, ...) UseMethod("PKNCAdata", data.conc) diff --git a/R/class-PKNCAdose.R b/R/class-PKNCAdose.R index fe567ac4..40f6555a 100644 --- a/R/class-PKNCAdose.R +++ b/R/class-PKNCAdose.R @@ -43,7 +43,7 @@ #' per group. When the right side is missing, PKNCA assumes that the #' same dose is given in every interval. When given as a two-sided #' formula -#' @seealso \code{\link{PKNCAconc}}, \code{\link{PKNCAdata}} +#' @family PKNCA objects #' @export PKNCAdose <- function(data, ...) UseMethod("PKNCAdose") diff --git a/R/class-PKNCAresults.R b/R/class-PKNCAresults.R index cc2229c0..af50f8ea 100644 --- a/R/class-PKNCAresults.R +++ b/R/class-PKNCAresults.R @@ -12,6 +12,7 @@ #' should have values of \code{NA} or \code{""} for concentrations to #' include and non-empty text for concentrations to exclude. #' @return A PKNCAresults object with each of the above within. +#' @family PKNCA objects #' @export PKNCAresults <- function(result, data, exclude) { ## Add all the parts into the object diff --git a/R/class-general.R b/R/class-general.R index 0559d94d..140f17fd 100644 --- a/R/class-general.R +++ b/R/class-general.R @@ -8,6 +8,7 @@ nlme::getGroups #' @param x The object to extract the formula from #' @param \dots Unused #' @return The vector of the dependent variable from the object. +#' @family PKNCA object extractors #' @export getDepVar <- function(x, ...) UseMethod("getDepVar", x) @@ -18,6 +19,7 @@ getDepVar <- function(x, ...) #' @param x The object to extract the formula from #' @param \dots Unused #' @return The vector of the independent variable from the object. +#' @family PKNCA object extractors #' @export getIndepVar <- function(x, ...) UseMethod("getIndepVar", x) @@ -54,6 +56,7 @@ getColumnValueOrNot <- function(data, value, prefix="X") { #' object. #' #' @param object The object to get the data name from. +#' @family PKNCA object extractors #' @return A character scalar with the name of the data object (or NULL #' if the method does not apply). getDataName <- function(object) diff --git a/R/cleaners.R b/R/cleaners.R index 314741c0..b42152c5 100644 --- a/R/cleaners.R +++ b/R/cleaners.R @@ -14,6 +14,7 @@ #' @param check Run \code{\link{check.conc.time}}? #' @return The concentration and time measurements (data frame) filtered #' and cleaned as requested relative to NA in the concentration. +#' @family Data cleaners #' @export clean.conc.na <- function(conc, time, ..., options=list(), @@ -79,7 +80,7 @@ clean.conc.na <- function(conc, time, ..., #' \item{a number}{Set the BLQ values to that number} #' } #' -#' @seealso \code{\link{clean.conc.na}} +#' @family Data cleaners #' @export clean.conc.blq <- function(conc, time, ..., diff --git a/R/exclude.R b/R/exclude.R index 5b040c59..e7ebf9c0 100644 --- a/R/exclude.R +++ b/R/exclude.R @@ -30,6 +30,7 @@ #' reason="Carryover", #' mask=c(TRUE, rep(FALSE, 6))) #' @export +#' @family Result exclusions #' @importFrom dplyr "%>%" #' @importFrom dplyr n #' @importFrom rlang syms diff --git a/R/exclude_nca.R b/R/exclude_nca.R index 029dca4e..26ea28fd 100644 --- a/R/exclude_nca.R +++ b/R/exclude_nca.R @@ -22,6 +22,7 @@ #' FUN=exclude_nca_max.aucinf.pext()) #' as.data.frame(my_result_excluded) #' @name exclude_nca +#' @family Result exclusions NULL #' @describeIn exclude_nca Exclude based on span.ratio diff --git a/R/half.life.R b/R/half.life.R index 9b6dba92..e8cbaaf5 100644 --- a/R/half.life.R +++ b/R/half.life.R @@ -70,6 +70,7 @@ #' lambda-z." Pharmacokinetic & Pharmacodynamic Data Analysis: Concepts #' and Applications, 4th Edition. Stockholm, Sweden: Swedish #' Pharmaceutical Press, 2000. 167-9. +#' @family NCA parameter calculations #' @export pk.calc.half.life <- function(conc, time, tmax, tlast, manually.selected.points=FALSE, diff --git a/R/parseFormula.R b/R/parseFormula.R index 4d015b46..ef790254 100644 --- a/R/parseFormula.R +++ b/R/parseFormula.R @@ -28,6 +28,7 @@ #' ## parseFormula("a~b", require.groups=TRUE) # This is an error #' parseFormula("a~b|c") #' parseFormula("a~b|c")$groups +#' @family Formula parsing #' @export parseFormula <- function (form, require.groups=FALSE, @@ -103,6 +104,7 @@ print.parseFormula <- function(x, ...) { #' dropping the left hand side? #' @param \dots Unused. #' @return A formula (optionally with portions removed) +#' @family Formula parsing #' @export formula.parseFormula <- function(x, drop.groups=FALSE, drop.lhs=FALSE, ...) { if (identical(x$lhs, NA) | drop.lhs) { @@ -127,6 +129,7 @@ formula.parseFormula <- function(x, drop.groups=FALSE, drop.lhs=FALSE, ...) { #' @return The side of the operator requested, NA if requesting the #' left side of a unary operator, and NULL if the operator is not #' found. +#' @family Formula parsing #' @export findOperator <- function(x, op, side) { side <- match.arg(tolower(side), diff --git a/R/pk.calc.all.R b/R/pk.calc.all.R index 1599540e..091f01f7 100644 --- a/R/pk.calc.all.R +++ b/R/pk.calc.all.R @@ -14,7 +14,8 @@ #' @param data A PKNCAdata object #' @return A \code{PKNCAresults} object. #' @seealso \code{\link{PKNCAdata}}, \code{\link{PKNCA.options}}, -#' \code{\link{summary.PKNCAresults}}, \code{\link{as.data.frame.PKNCAresults}} +#' \code{\link{summary.PKNCAresults}}, \code{\link{as.data.frame.PKNCAresults}}, +#' \code{\link{exclude}} #' @export #' @importFrom utils capture.output #' @importFrom dplyr bind_rows diff --git a/R/pk.calc.simple.R b/R/pk.calc.simple.R index f871aa84..44881b1c 100644 --- a/R/pk.calc.simple.R +++ b/R/pk.calc.simple.R @@ -193,6 +193,8 @@ add.interval.col("clast.obs", PKNCA.set.summary("clast.obs", business.geomean, business.geocv) #' Calculate the effective half-life +#' +#' @details thalf.eff is \code{log(2)*mrt}. #' #' @param mrt the mean residence time to infinity #' @return the numeric value of the effective half-life @@ -245,6 +247,8 @@ PKNCA.set.summary("thalf.eff.iv.last", business.geomean, business.geocv) #' Calculate the AUC percent extrapolated #' +#' @details aucpext is \code{100*(1-auclast/aucinf)}. +#' #' @param auclast the area under the curve from time 0 to the last #' measurement above the limit of quantification #' @param aucinf the area under the curve from time 0 to infinity @@ -301,6 +305,8 @@ PKNCA.set.summary("aucpext.pred", business.mean, business.sd) #' Calculate the elimination rate (Kel) #' +#' @param kel is \code{1/mrt}, not to be confused with lambda.z. +#' #' @param mrt the mean residence time #' @return the numeric value of the elimination rate #' @export @@ -352,6 +358,8 @@ PKNCA.set.summary("kel.iv.last", business.geomean, business.geocv) #' Calculate the (observed oral) clearance #' +#' @details cl is \code{dose/auc}. +#' #' @param dose the dose administered #' @param auc The area under the concentration-time curve. #' @return the numeric value of the total (CL) or observed oral clearance (CL/F) @@ -408,6 +416,8 @@ add.interval.col("cl.pred", PKNCA.set.summary("cl.pred", business.geomean, business.geocv) #' Calculate the absolute (or relative) bioavailability +#' +#' @details f is \code{(auc2/dose2)/(auc1/dose1)}. #' #' @param dose1 The dose administered in route or method 1 #' @param dose2 The dose administered in route or method 2 @@ -434,8 +444,11 @@ add.interval.col("f", depends=c()) PKNCA.set.summary("f", business.geomean, business.geocv) -#' Calculate the mean residence time (MRT) for single-dose data or -#' linear multiple-dose data. +#' Calculate the mean residence time (MRT) for single-dose data or linear +#' multiple-dose data. +#' +#' @details mrt is \code{aumc/auc - duration.dose/2} where \code{duration.dose = +#' 0} for oral administration. #' #' @param auc the AUC from 0 to infinity or 0 to tau #' @param aumc the AUMC from 0 to infinity or 0 to tau @@ -503,8 +516,11 @@ add.interval.col("mrt.iv.last", depends=list("auclast", "aumclast")) PKNCA.set.summary("mrt.iv.last", business.geomean, business.geocv) -#' Calculate the mean residence time (MRT) for multiple-dose data with -#' nonlinear kinetics. +#' Calculate the mean residence time (MRT) for multiple-dose data with nonlinear +#' kinetics. +#' +#' @details mrt.md is \code{aumctau/auctau + tau*(aucinf-auctau)/auctau} and +#' should only be used for multiple dosing with equal intervals between doses. #' #' @param auctau the AUC from time 0 to the end of the dosing interval #' (tau). @@ -543,6 +559,8 @@ PKNCA.set.summary("mrt.md.pred", business.geomean, business.geocv) #' Calculate the terminal volume of distribution (Vz) #' +#' @details vz is \code{cl/lambda.z}. +#' #' @param cl the clearance (or apparent observed clearance) #' @param lambda.z the elimination rate #' @export @@ -573,6 +591,7 @@ PKNCA.set.summary("vz.pred", business.geomean, business.geocv) #' Calculate the steady-state volume of distribution (Vss) #' +#' @details vss is \code{cl*mrt}. #' @param cl the clearance #' @param mrt the mean residence time #' @return the volume of distribution at steady-state @@ -641,6 +660,8 @@ PKNCA.set.summary("vss.md.pred", business.geomean, business.geocv) #' Calculate the volume of distribution (Vd) or observed volume of #' distribution (Vd/F) #' +#' @details vd is \code{dose/(aucinf * lambda.z)}. +#' #' @param dose One or more doses given during an interval #' @param aucinf Area under the curve to infinity (either predicted or #' observed). @@ -685,6 +706,8 @@ add.interval.col("vd.pred", PKNCA.set.summary("vd.pred", business.geomean, business.geocv) #' Calculate the average concentration during an interval. +#' +#' @details cav is \code{auclast/(end-start)}. #' #' @param auclast The area under the curve during the interval #' @param start The starting time of the interval @@ -736,6 +759,8 @@ PKNCA.set.summary("ctrough", business.geomean, business.geocv) #' Determine the peak-to-trough ratio #' +#' @details ptr is \code{cmax/cmin}. +#' #' @param cmax The maximum observed concentration #' @param cmin The minimum observed concentration #' @return The ratio of cmax to cmin (if cmin == 0, NA) @@ -778,6 +803,8 @@ PKNCA.set.summary("tlag", business.median, business.range) #' Determine the degree of fluctuation #' +#' @details deg.fluc is \code{100*(cmax - cmin)/cav}. +#' #' @param cmax The maximum observed concentration #' @param cmin The minimum observed concentration #' @param cav The average concentration in the interval @@ -799,6 +826,8 @@ PKNCA.set.summary("deg.fluc", business.mean, business.sd) #' Determine the PK swing #' +#' @details swing is \code{100*(cmax - cmin)/cmin}. +#' #' @param cmax The maximum observed concentration #' @param cmin The minimum observed concentration #' @return The swing above the minimum concentration. If \code{cmin} is zero, diff --git a/R/pk.calc.urine.R b/R/pk.calc.urine.R index dedd212f..98f3ace3 100644 --- a/R/pk.calc.urine.R +++ b/R/pk.calc.urine.R @@ -1,5 +1,7 @@ #' Calculate amount excreted (typically in urine or feces) -#' +#' +#' @details ae is \code{sum(conc*volume)}. +#' #' @param conc The concentration in the sample #' @param volume The volume (or mass) of the sample #' @param check Should the concentration and volume data be checked? @@ -19,6 +21,8 @@ PKNCA.set.summary("ae", business.geomean, business.geocv) #' Calculate renal clearance #' +#' @details clr is \code{sum(ae)/auc}. +#' #' @param ae The amount excreted in urine (as a numeric scalar or #' vector) #' @param auc The area under the curve (as a numeric scalar or vector) @@ -51,6 +55,8 @@ PKNCA.set.summary("clr.pred", business.geomean, business.geocv) #' Calculate fraction excreted (typically in urine or feces) #' +#' @details fe is \code{sum(ae)/dose} +#' #' @param ae The amount excreted (as a numeric scalar or vector) #' @param dose The dose (as a numeric scalar or vector) #' @return The fraction of dose excreted. diff --git a/R/tss.R b/R/tss.R index 1a4d8686..3dd29fe6 100644 --- a/R/tss.R +++ b/R/tss.R @@ -96,8 +96,7 @@ pk.tss.data.prep <- function(conc, time, subject, treatment, #' \code{stepwise.linear} or \code{monoexponential} #' @return A data frame with columns as defined from #' \code{pk.tss.monoexponential} and/or \code{pk.tss.stepwise.linear}. -#' @seealso \code{\link{pk.tss.monoexponential}}, -#' \code{\link{pk.tss.stepwise.linear}} +#' @family Time to steady-state calculations #' @export pk.tss <- function(..., type=c("monoexponential", "stepwise.linear"), diff --git a/R/tss.monoexponential.R b/R/tss.monoexponential.R index e9ee6602..575841f3 100644 --- a/R/tss.monoexponential.R +++ b/R/tss.monoexponential.R @@ -24,7 +24,7 @@ #' #' @return A scalar float for the first time when steady-state is #' achieved or \code{NA} if it is not observed. -#' @seealso \code{\link{pk.tss}}, \code{\link{pk.tss.stepwise.linear}} +#' @family Time to steady-state calculations #' @references #' Maganti L, Panebianco DL, Maes AL. Evaluation of Methods for #' Estimating Time to Steady State with Examples from Phase 1 Studies. diff --git a/R/tss.stepwise.linear.R b/R/tss.stepwise.linear.R index 9bf319ba..cadde403 100644 --- a/R/tss.stepwise.linear.R +++ b/R/tss.stepwise.linear.R @@ -21,7 +21,7 @@ #' while running. #' @return A scalar float for the first time when steady-state is #' achieved or \code{NA} if it is not observed. -#' @seealso \code{\link{pk.tss.monoexponential}} +#' @family Time to steady-state calculations #' @references #' Maganti L, Panebianco DL, Maes AL. Evaluation of Methods for #' Estimating Time to Steady State with Examples from Phase 1 Studies. diff --git a/man/PKNCA.choose.option.Rd b/man/PKNCA.choose.option.Rd index 954a0ec9..2c7c47a0 100644 --- a/man/PKNCA.choose.option.Rd +++ b/man/PKNCA.choose.option.Rd @@ -24,5 +24,7 @@ Choose either the value from an option list or the current set value for an option. } \seealso{ -\code{\link{PKNCA.options}} +Other PKNCA calculation and summary settings: \code{\link{PKNCA.options}}, + \code{\link{PKNCA.set.summary}} } +\concept{PKNCA calculation and summary settings} diff --git a/man/PKNCA.options.Rd b/man/PKNCA.options.Rd index 77489279..a8aed1d5 100644 --- a/man/PKNCA.options.Rd +++ b/man/PKNCA.options.Rd @@ -55,5 +55,7 @@ PKNCA.options(name="auc.method") PKNCA.options(auc.method="lin up/log down", min.hl.points=3) } \seealso{ -\code{\link{PKNCA.choose.option}} +Other PKNCA calculation and summary settings: \code{\link{PKNCA.choose.option}}, + \code{\link{PKNCA.set.summary}} } +\concept{PKNCA calculation and summary settings} diff --git a/man/PKNCA.set.summary.Rd b/man/PKNCA.set.summary.Rd index 3def71ed..8baba555 100644 --- a/man/PKNCA.set.summary.Rd +++ b/man/PKNCA.set.summary.Rd @@ -39,4 +39,8 @@ Define how NCA parameters are summarized. } \seealso{ \code{\link{summary.PKNCAresults}} + +Other PKNCA calculation and summary settings: \code{\link{PKNCA.choose.option}}, + \code{\link{PKNCA.options}} } +\concept{PKNCA calculation and summary settings} diff --git a/man/PKNCAconc.Rd b/man/PKNCAconc.Rd index 7d8e96c6..902a2859 100644 --- a/man/PKNCAconc.Rd +++ b/man/PKNCAconc.Rd @@ -66,5 +66,7 @@ A PKNCAconc object that can be used for automated NCA. Create a PKNCAconc object } \seealso{ -\code{\link{PKNCAdata}}, \code{\link{PKNCAdose}} +Other PKNCA objects: \code{\link{PKNCAdata}}, + \code{\link{PKNCAdose}}, \code{\link{PKNCAresults}} } +\concept{PKNCA objects} diff --git a/man/PKNCAdata.Rd b/man/PKNCAdata.Rd index 95bddc79..91d0bf99 100644 --- a/man/PKNCAdata.Rd +++ b/man/PKNCAdata.Rd @@ -58,6 +58,9 @@ If \code{data.dose} is not given or is \code{NA}, then the and \code{intervals} must be given. } \seealso{ -\code{\link{PKNCAconc}}, \code{\link{PKNCAdose}}, - \code{\link{choose.auc.intervals}}, \code{\link{pk.nca}} +\code{\link{choose.auc.intervals}}, \code{\link{pk.nca}} + +Other PKNCA objects: \code{\link{PKNCAconc}}, + \code{\link{PKNCAdose}}, \code{\link{PKNCAresults}} } +\concept{PKNCA objects} diff --git a/man/PKNCAdose.Rd b/man/PKNCAdose.Rd index 27a4f06d..9be1cf18 100644 --- a/man/PKNCAdose.Rd +++ b/man/PKNCAdose.Rd @@ -75,5 +75,7 @@ The \code{formula} for a \code{PKNCAdose} object can be formula } \seealso{ -\code{\link{PKNCAconc}}, \code{\link{PKNCAdata}} +Other PKNCA objects: \code{\link{PKNCAconc}}, + \code{\link{PKNCAdata}}, \code{\link{PKNCAresults}} } +\concept{PKNCA objects} diff --git a/man/PKNCAresults.Rd b/man/PKNCAresults.Rd index ef156814..fcf5702d 100644 --- a/man/PKNCAresults.Rd +++ b/man/PKNCAresults.Rd @@ -25,3 +25,8 @@ A PKNCAresults object with each of the above within. This function should not be run directly. The object is created for summarization and plotting. } +\seealso{ +Other PKNCA objects: \code{\link{PKNCAconc}}, + \code{\link{PKNCAdata}}, \code{\link{PKNCAdose}} +} +\concept{PKNCA objects} diff --git a/man/add.interval.col.Rd b/man/add.interval.col.Rd index a1ca0adf..a2848bf1 100644 --- a/man/add.interval.col.Rd +++ b/man/add.interval.col.Rd @@ -86,3 +86,11 @@ add.interval.col("cmax.dn", depends=c("cmax")) } } +\seealso{ +Other Interval specifications: \code{\link{check.interval.deps}}, + \code{\link{check.interval.specification}}, + \code{\link{choose.auc.intervals}}, + \code{\link{get.interval.cols}}, + \code{\link{get.parameter.deps}} +} +\concept{Interval specifications} diff --git a/man/check.interval.deps.Rd b/man/check.interval.deps.Rd index d7887aca..d0f4cbba 100644 --- a/man/check.interval.deps.Rd +++ b/man/check.interval.deps.Rd @@ -21,5 +21,10 @@ row updated with any additional calculations that must be done to fulfill all dependencies. } \seealso{ -\code{\link{check.interval.specification}} +Other Interval specifications: \code{\link{add.interval.col}}, + \code{\link{check.interval.specification}}, + \code{\link{choose.auc.intervals}}, + \code{\link{get.interval.cols}}, + \code{\link{get.parameter.deps}} } +\concept{Interval specifications} diff --git a/man/check.interval.specification.Rd b/man/check.interval.specification.Rd index d810ba6d..83cddf8f 100644 --- a/man/check.interval.specification.Rd +++ b/man/check.interval.specification.Rd @@ -28,7 +28,12 @@ the parameters to be calculated and the groupings to apply the intervals to. } \seealso{ -\code{\link{check.interval.deps}}, \code{\link{get.parameter.deps}}, - \code{\link{get.interval.cols}}, and the vignette "Selection of Calculation - Intervals" +The vignette "Selection of Calculation Intervals" + +Other Interval specifications: \code{\link{add.interval.col}}, + \code{\link{check.interval.deps}}, + \code{\link{choose.auc.intervals}}, + \code{\link{get.interval.cols}}, + \code{\link{get.parameter.deps}} } +\concept{Interval specifications} diff --git a/man/choose.auc.intervals.Rd b/man/choose.auc.intervals.Rd index 0593f77f..e58fd4f2 100644 --- a/man/choose.auc.intervals.Rd +++ b/man/choose.auc.intervals.Rd @@ -40,6 +40,15 @@ Intervals for AUC are selected by the following metrics: } \seealso{ \code{\link{pk.calc.auc}}, \code{\link{pk.calc.aumc}}, -\code{\link{pk.calc.half.life}}, \code{\link{find.tau}}, -\code{\link{check.interval.specification}}, \code{\link{PKNCA.options}} +\code{\link{pk.calc.half.life}}, \code{\link{PKNCA.options}} + +Other Interval specifications: \code{\link{add.interval.col}}, + \code{\link{check.interval.deps}}, + \code{\link{check.interval.specification}}, + \code{\link{get.interval.cols}}, + \code{\link{get.parameter.deps}} + +Other Interval determination: \code{\link{find.tau}} } +\concept{Interval determination} +\concept{Interval specifications} diff --git a/man/clean.conc.blq.Rd b/man/clean.conc.blq.Rd index d1e4724c..f22859e7 100644 --- a/man/clean.conc.blq.Rd +++ b/man/clean.conc.blq.Rd @@ -62,5 +62,6 @@ The valid settings for each are: } } \seealso{ -\code{\link{clean.conc.na}} +Other Data cleaners: \code{\link{clean.conc.na}} } +\concept{Data cleaners} diff --git a/man/clean.conc.na.Rd b/man/clean.conc.na.Rd index f919adc6..f1323d9c 100644 --- a/man/clean.conc.na.Rd +++ b/man/clean.conc.na.Rd @@ -31,3 +31,7 @@ The concentration and time measurements (data frame) filtered NA concentrations (and their associated times) will be removed then the BLQ values in the middle } +\seealso{ +Other Data cleaners: \code{\link{clean.conc.blq}} +} +\concept{Data cleaners} diff --git a/man/exclude.Rd b/man/exclude.Rd index 789fa874..d74cf9f7 100644 --- a/man/exclude.Rd +++ b/man/exclude.Rd @@ -55,3 +55,7 @@ exclude(myconc, reason="Carryover", mask=c(TRUE, rep(FALSE, 6))) } +\seealso{ +Other Result exclusions: \code{\link{exclude_nca}} +} +\concept{Result exclusions} diff --git a/man/exclude_nca.Rd b/man/exclude_nca.Rd index 76174853..39e37308 100644 --- a/man/exclude_nca.Rd +++ b/man/exclude_nca.Rd @@ -52,3 +52,7 @@ my_result_excluded <- exclude(my_result, FUN=exclude_nca_max.aucinf.pext()) as.data.frame(my_result_excluded) } +\seealso{ +Other Result exclusions: \code{\link{exclude}} +} +\concept{Result exclusions} diff --git a/man/find.tau.Rd b/man/find.tau.Rd index bdae0062..1ae78fa1 100644 --- a/man/find.tau.Rd +++ b/man/find.tau.Rd @@ -36,3 +36,7 @@ repetition. This is intended to find the interval over which x repeats by the rule unique(mod(x, interval)) is minimized. } +\seealso{ +Other Interval determination: \code{\link{choose.auc.intervals}} +} +\concept{Interval determination} diff --git a/man/findOperator.Rd b/man/findOperator.Rd index 174a3eab..5a3fc685 100644 --- a/man/findOperator.Rd +++ b/man/findOperator.Rd @@ -25,3 +25,8 @@ found. Find the first occurrence of an operator in a formula and return the left, right, or both sides of the operator. } +\seealso{ +Other Formula parsing: \code{\link{formula.parseFormula}}, + \code{\link{parseFormula}} +} +\concept{Formula parsing} diff --git a/man/formula.parseFormula.Rd b/man/formula.parseFormula.Rd index 00ef52cf..e0421003 100644 --- a/man/formula.parseFormula.Rd +++ b/man/formula.parseFormula.Rd @@ -24,3 +24,8 @@ A formula (optionally with portions removed) \description{ Convert the parsed formula back into the original } +\seealso{ +Other Formula parsing: \code{\link{findOperator}}, + \code{\link{parseFormula}} +} +\concept{Formula parsing} diff --git a/man/geomean.Rd b/man/geomean.Rd index 1c4c7acd..aff7537a 100644 --- a/man/geomean.Rd +++ b/man/geomean.Rd @@ -26,9 +26,11 @@ Compute the geometric mean, sd, and CV } \section{Functions}{ \itemize{ -\item \code{geosd}: Compute the geometric standard deviation. +\item \code{geosd}: Compute the geometric standard deviation, +\code{exp(sd(log(x)))}. -\item \code{geocv}: Compute the geometric coefficient of variation. +\item \code{geocv}: Compute the geometric coefficient of variation, +\code{sqrt(exp(sd(log(x))^2)-1)*100}. }} \references{ diff --git a/man/get.interval.cols.Rd b/man/get.interval.cols.Rd index 1da03139..f7259a32 100644 --- a/man/get.interval.cols.Rd +++ b/man/get.interval.cols.Rd @@ -19,4 +19,11 @@ get.interval.cols() \seealso{ \code{\link{check.interval.specification}} and the vignette "Selection of Calculation Intervals" + +Other Interval specifications: \code{\link{add.interval.col}}, + \code{\link{check.interval.deps}}, + \code{\link{check.interval.specification}}, + \code{\link{choose.auc.intervals}}, + \code{\link{get.parameter.deps}} } +\concept{Interval specifications} diff --git a/man/get.parameter.deps.Rd b/man/get.parameter.deps.Rd index e1d8224b..2dad2a43 100644 --- a/man/get.parameter.deps.Rd +++ b/man/get.parameter.deps.Rd @@ -17,3 +17,11 @@ A character vector of parameter names that depend on the \description{ Get all columns that depend on a parameter } +\seealso{ +Other Interval specifications: \code{\link{add.interval.col}}, + \code{\link{check.interval.deps}}, + \code{\link{check.interval.specification}}, + \code{\link{choose.auc.intervals}}, + \code{\link{get.interval.cols}} +} +\concept{Interval specifications} diff --git a/man/getDataName.Rd b/man/getDataName.Rd index 2da9e77c..c57c6369 100644 --- a/man/getDataName.Rd +++ b/man/getDataName.Rd @@ -39,3 +39,8 @@ object. \item \code{default}: If no data name exists, returns NULL. }} +\seealso{ +Other PKNCA object extractors: \code{\link{getDepVar}}, + \code{\link{getIndepVar}} +} +\concept{PKNCA object extractors} diff --git a/man/getDepVar.Rd b/man/getDepVar.Rd index c302fc5c..2e86924f 100644 --- a/man/getDepVar.Rd +++ b/man/getDepVar.Rd @@ -19,3 +19,8 @@ The vector of the dependent variable from the object. Get the dependent variable (left hand side of the formula) from a PKNCA object. } +\seealso{ +Other PKNCA object extractors: \code{\link{getDataName.PKNCAconc}}, + \code{\link{getIndepVar}} +} +\concept{PKNCA object extractors} diff --git a/man/getIndepVar.Rd b/man/getIndepVar.Rd index 75136367..f1ec910b 100644 --- a/man/getIndepVar.Rd +++ b/man/getIndepVar.Rd @@ -19,3 +19,8 @@ The vector of the independent variable from the object. Get the independent variable (right hand side of the formula) from a PKNCA object. } +\seealso{ +Other PKNCA object extractors: \code{\link{getDataName.PKNCAconc}}, + \code{\link{getDepVar}} +} +\concept{PKNCA object extractors} diff --git a/man/parseFormula.Rd b/man/parseFormula.Rd index 69f34121..501256ba 100644 --- a/man/parseFormula.Rd +++ b/man/parseFormula.Rd @@ -43,3 +43,8 @@ parseFormula("a~b", require.groups=FALSE) parseFormula("a~b|c") parseFormula("a~b|c")$groups } +\seealso{ +Other Formula parsing: \code{\link{findOperator}}, + \code{\link{formula.parseFormula}} +} +\concept{Formula parsing} diff --git a/man/pk.calc.ae.Rd b/man/pk.calc.ae.Rd index 8f0b15f6..f162a0cc 100644 --- a/man/pk.calc.ae.Rd +++ b/man/pk.calc.ae.Rd @@ -20,6 +20,8 @@ The amount excreted during the interval Calculate amount excreted (typically in urine or feces) } \details{ +ae is \code{sum(conc*volume)}. + The units for the concentration and volume should match such that \code{sum(conc*volume)} has units of mass or moles. } diff --git a/man/pk.calc.aucint.Rd b/man/pk.calc.aucint.Rd index 3267d6df..3d3eb9ae 100644 --- a/man/pk.calc.aucint.Rd +++ b/man/pk.calc.aucint.Rd @@ -87,6 +87,8 @@ for AUCinf.pred }} \seealso{ -\code{\link{pk.calc.auxc}}, \code{\link{PKNCA.options}}, - \code{\link{interp.extrap.conc.dose}} +\code{\link{PKNCA.options}}, \code{\link{interp.extrap.conc.dose}} + +Other AUC calculations: \code{\link{pk.calc.auxc}} } +\concept{AUC calculations} diff --git a/man/pk.calc.aucpext.Rd b/man/pk.calc.aucpext.Rd index 0ee30058..03af5f89 100644 --- a/man/pk.calc.aucpext.Rd +++ b/man/pk.calc.aucpext.Rd @@ -21,3 +21,6 @@ The numeric value of the AUC percent extrapolated or \description{ Calculate the AUC percent extrapolated } +\details{ +aucpext is \code{100*(1-auclast/aucinf)}. +} diff --git a/man/pk.calc.auxc.Rd b/man/pk.calc.auxc.Rd index c145d48f..7a0f29cb 100644 --- a/man/pk.calc.auxc.Rd +++ b/man/pk.calc.auxc.Rd @@ -159,6 +159,8 @@ and Applications, 4th Edition. Stockholm, Sweden: Swedish Pharmaceutical Press, 2000. 164-7. } \seealso{ -\code{\link{pk.calc.auc.all}}, \code{\link{pk.calc.auc.last}}, - \code{\link{clean.conc.blq}} +\code{\link{clean.conc.blq}} + +Other AUC calculations: \code{\link{pk.calc.aucint}} } +\concept{AUC calculations} diff --git a/man/pk.calc.cav.Rd b/man/pk.calc.cav.Rd index 43f6049c..3162712d 100644 --- a/man/pk.calc.cav.Rd +++ b/man/pk.calc.cav.Rd @@ -19,3 +19,6 @@ The Cav (average concentration during the interval) \description{ Calculate the average concentration during an interval. } +\details{ +cav is \code{auclast/(end-start)}. +} diff --git a/man/pk.calc.cl.Rd b/man/pk.calc.cl.Rd index f67ddc11..3cc30680 100644 --- a/man/pk.calc.cl.Rd +++ b/man/pk.calc.cl.Rd @@ -18,6 +18,8 @@ the numeric value of the total (CL) or observed oral clearance (CL/F) Calculate the (observed oral) clearance } \details{ +cl is \code{dose/auc}. + If \code{dose} is the same length as the other inputs, then the output will be the same length as all of the inputs; the function assumes that you are calculating for multiple intervals simultaneously. If the diff --git a/man/pk.calc.clr.Rd b/man/pk.calc.clr.Rd index 9fb4a2e2..8dc9411e 100644 --- a/man/pk.calc.clr.Rd +++ b/man/pk.calc.clr.Rd @@ -19,6 +19,8 @@ The renal clearance as a number Calculate renal clearance } \details{ +clr is \code{sum(ae)/auc}. + The units for the \code{ae} and \code{auc} should match such that \code{ae/auc} has units of volume/time. } diff --git a/man/pk.calc.deg.fluc.Rd b/man/pk.calc.deg.fluc.Rd index e57eda39..cb591c9a 100644 --- a/man/pk.calc.deg.fluc.Rd +++ b/man/pk.calc.deg.fluc.Rd @@ -19,3 +19,6 @@ The degree of fluctuation around the average concentration. \description{ Determine the degree of fluctuation } +\details{ +deg.fluc is \code{100*(cmax - cmin)/cav}. +} diff --git a/man/pk.calc.f.Rd b/man/pk.calc.f.Rd index bbdb1bae..76244acc 100644 --- a/man/pk.calc.f.Rd +++ b/man/pk.calc.f.Rd @@ -20,3 +20,6 @@ route or method 2} \description{ Calculate the absolute (or relative) bioavailability } +\details{ +f is \code{(auc2/dose2)/(auc1/dose1)}. +} diff --git a/man/pk.calc.fe.Rd b/man/pk.calc.fe.Rd index cd344586..ad7d9244 100644 --- a/man/pk.calc.fe.Rd +++ b/man/pk.calc.fe.Rd @@ -18,6 +18,8 @@ The fraction of dose excreted. Calculate fraction excreted (typically in urine or feces) } \details{ +fe is \code{sum(ae)/dose} + The units for \code{ae} and \code{dose} should be the same so that \code{ae/dose} is a unitless fraction. } diff --git a/man/pk.calc.half.life.Rd b/man/pk.calc.half.life.Rd index 7a668c2e..3971df86 100644 --- a/man/pk.calc.half.life.Rd +++ b/man/pk.calc.half.life.Rd @@ -98,3 +98,4 @@ lambda-z." Pharmacokinetic & Pharmacodynamic Data Analysis: Concepts and Applications, 4th Edition. Stockholm, Sweden: Swedish Pharmaceutical Press, 2000. 167-9. } +\concept{NCA parameter calculations} diff --git a/man/pk.calc.kel.Rd b/man/pk.calc.kel.Rd index 6f1e2344..e1cadbeb 100644 --- a/man/pk.calc.kel.Rd +++ b/man/pk.calc.kel.Rd @@ -8,6 +8,8 @@ pk.calc.kel(mrt) } \arguments{ \item{mrt}{the mean residence time} + +\item{kel}{is \code{1/mrt}, not to be confused with lambda.z.} } \value{ the numeric value of the elimination rate diff --git a/man/pk.calc.mrt.Rd b/man/pk.calc.mrt.Rd index bdc122d0..3444b7a6 100644 --- a/man/pk.calc.mrt.Rd +++ b/man/pk.calc.mrt.Rd @@ -3,8 +3,8 @@ \name{pk.calc.mrt} \alias{pk.calc.mrt} \alias{pk.calc.mrt.iv} -\title{Calculate the mean residence time (MRT) for single-dose data or -linear multiple-dose data.} +\title{Calculate the mean residence time (MRT) for single-dose data or linear +multiple-dose data.} \usage{ pk.calc.mrt(auc, aumc) @@ -22,8 +22,12 @@ duration for an IV infusion)} the numeric value of the mean residence time } \description{ -Calculate the mean residence time (MRT) for single-dose data or -linear multiple-dose data. +Calculate the mean residence time (MRT) for single-dose data or linear +multiple-dose data. +} +\details{ +mrt is \code{aumc/auc - duration.dose/2} where \code{duration.dose = + 0} for oral administration. } \section{Functions}{ \itemize{ diff --git a/man/pk.calc.mrt.md.Rd b/man/pk.calc.mrt.md.Rd index b20aad2c..3dcae6df 100644 --- a/man/pk.calc.mrt.md.Rd +++ b/man/pk.calc.mrt.md.Rd @@ -2,8 +2,8 @@ % Please edit documentation in R/pk.calc.simple.R \name{pk.calc.mrt.md} \alias{pk.calc.mrt.md} -\title{Calculate the mean residence time (MRT) for multiple-dose data with -nonlinear kinetics.} +\title{Calculate the mean residence time (MRT) for multiple-dose data with nonlinear +kinetics.} \usage{ pk.calc.mrt.md(auctau, aumctau, aucinf, tau) } @@ -20,10 +20,13 @@ single-dose data)} \item{tau}{the dosing interval} } \description{ -Calculate the mean residence time (MRT) for multiple-dose data with -nonlinear kinetics. +Calculate the mean residence time (MRT) for multiple-dose data with nonlinear +kinetics. } \details{ +mrt.md is \code{aumctau/auctau + tau*(aucinf-auctau)/auctau} and +should only be used for multiple dosing with equal intervals between doses. + Note that if \code{aucinf == auctau} (as would be the assumption with linear kinetics), the equation becomes the same as the single-dose MRT. diff --git a/man/pk.calc.ptr.Rd b/man/pk.calc.ptr.Rd index d7d9393b..2d27452c 100644 --- a/man/pk.calc.ptr.Rd +++ b/man/pk.calc.ptr.Rd @@ -17,3 +17,6 @@ The ratio of cmax to cmin (if cmin == 0, NA) \description{ Determine the peak-to-trough ratio } +\details{ +ptr is \code{cmax/cmin}. +} diff --git a/man/pk.calc.swing.Rd b/man/pk.calc.swing.Rd index 8ec61d59..bc12f3a1 100644 --- a/man/pk.calc.swing.Rd +++ b/man/pk.calc.swing.Rd @@ -18,3 +18,6 @@ The swing above the minimum concentration. If \code{cmin} is zero, \description{ Determine the PK swing } +\details{ +swing is \code{100*(cmax - cmin)/cmin}. +} diff --git a/man/pk.calc.thalf.eff.Rd b/man/pk.calc.thalf.eff.Rd index 801b447a..e8fe78aa 100644 --- a/man/pk.calc.thalf.eff.Rd +++ b/man/pk.calc.thalf.eff.Rd @@ -15,3 +15,6 @@ the numeric value of the effective half-life \description{ Calculate the effective half-life } +\details{ +thalf.eff is \code{log(2)*mrt}. +} diff --git a/man/pk.calc.vd.Rd b/man/pk.calc.vd.Rd index acb0e9b6..f00f9b6e 100644 --- a/man/pk.calc.vd.Rd +++ b/man/pk.calc.vd.Rd @@ -23,6 +23,8 @@ Calculate the volume of distribution (Vd) or observed volume of distribution (Vd/F) } \details{ +vd is \code{dose/(aucinf * lambda.z)}. + If \code{dose} is the same length as the other inputs, then the output will be the same length as all of the inputs; the function assumes that you are calculating for multiple intervals diff --git a/man/pk.calc.vss.Rd b/man/pk.calc.vss.Rd index 47dcf055..feb90284 100644 --- a/man/pk.calc.vss.Rd +++ b/man/pk.calc.vss.Rd @@ -17,3 +17,6 @@ the volume of distribution at steady-state \description{ Calculate the steady-state volume of distribution (Vss) } +\details{ +vss is \code{cl*mrt}. +} diff --git a/man/pk.calc.vz.Rd b/man/pk.calc.vz.Rd index 24dee69e..1dff5f4f 100644 --- a/man/pk.calc.vz.Rd +++ b/man/pk.calc.vz.Rd @@ -14,3 +14,6 @@ pk.calc.vz(cl, lambda.z) \description{ Calculate the terminal volume of distribution (Vz) } +\details{ +vz is \code{cl/lambda.z}. +} diff --git a/man/pk.nca.Rd b/man/pk.nca.Rd index b809816c..f60cb72e 100644 --- a/man/pk.nca.Rd +++ b/man/pk.nca.Rd @@ -27,5 +27,6 @@ hours, and and the maximum concentration is at 169 hours, } \seealso{ \code{\link{PKNCAdata}}, \code{\link{PKNCA.options}}, - \code{\link{summary.PKNCAresults}}, \code{\link{as.data.frame.PKNCAresults}} + \code{\link{summary.PKNCAresults}}, \code{\link{as.data.frame.PKNCAresults}}, + \code{\link{exclude}} } diff --git a/man/pk.tss.Rd b/man/pk.tss.Rd index 3eb980d6..784b23af 100644 --- a/man/pk.tss.Rd +++ b/man/pk.tss.Rd @@ -24,6 +24,7 @@ A data frame with columns as defined from Compute the time to steady-state (tss) } \seealso{ -\code{\link{pk.tss.monoexponential}}, -\code{\link{pk.tss.stepwise.linear}} +Other Time to steady-state calculations: \code{\link{pk.tss.monoexponential}}, + \code{\link{pk.tss.stepwise.linear}} } +\concept{Time to steady-state calculations} diff --git a/man/pk.tss.monoexponential.Rd b/man/pk.tss.monoexponential.Rd index 9b975754..8301d75a 100644 --- a/man/pk.tss.monoexponential.Rd +++ b/man/pk.tss.monoexponential.Rd @@ -46,5 +46,7 @@ Estimating Time to Steady State with Examples from Phase 1 Studies. AAPS Journal 10(1):141-7. doi:10.1208/s12248-008-9014-y } \seealso{ -\code{\link{pk.tss}}, \code{\link{pk.tss.stepwise.linear}} +Other Time to steady-state calculations: \code{\link{pk.tss.stepwise.linear}}, + \code{\link{pk.tss}} } +\concept{Time to steady-state calculations} diff --git a/man/pk.tss.stepwise.linear.Rd b/man/pk.tss.stepwise.linear.Rd index 5b79fa2c..887f7291 100644 --- a/man/pk.tss.stepwise.linear.Rd +++ b/man/pk.tss.stepwise.linear.Rd @@ -44,5 +44,7 @@ Estimating Time to Steady State with Examples from Phase 1 Studies. AAPS Journal 10(1):141-7. doi:10.1208/s12248-008-9014-y } \seealso{ -\code{\link{pk.tss.monoexponential}} +Other Time to steady-state calculations: \code{\link{pk.tss.monoexponential}}, + \code{\link{pk.tss}} } +\concept{Time to steady-state calculations}