Skip to content

Commit 4601dc3

Browse files
committed
Fixed documentation for several functions
1 parent 5089d68 commit 4601dc3

File tree

7 files changed

+11
-9
lines changed

7 files changed

+11
-9
lines changed

NAMESPACE

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -81,6 +81,7 @@ importFrom(stats,pnorm)
8181
importFrom(stats,predict)
8282
importFrom(stats,qgamma)
8383
importFrom(stats,qnorm)
84+
importFrom(stats,quantile)
8485
importFrom(stats,resid)
8586
importFrom(stats,rnorm)
8687
importFrom(stats,runif)

R/bart.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1761,7 +1761,7 @@ bart <- function(
17611761
#' Predict from a sampled BART model on new data
17621762
#'
17631763
#' @param object Object of type `bart` containing draws of a regression forest and associated sampling outputs.
1764-
#' @param X Covariates used to determine tree leaf predictions for each observation. Must be passed as a matrix or dataframe.
1764+
#' @param covariates Covariates used to determine tree leaf predictions for each observation. Must be passed as a matrix or dataframe.
17651765
#' @param leaf_basis (Optional) Bases used for prediction (by e.g. dot product with leaf values). Default: `NULL`.
17661766
#' @param rfx_group_ids (Optional) Test set group labels used for an additive random effects model.
17671767
#' We do not currently support (but plan to in the near future), test set evaluation for group labels

R/posterior_transformation.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -356,7 +356,7 @@ posterior_predictive_heuristic_multiplier <- function(
356356
#'
357357
#' This function computes posterior credible intervals for specified terms from a fitted BCF model. It supports intervals for prognostic forests, CATE forests, variance forests, random effects, and overall mean outcome predictions.
358358
#' @param model_object A fitted BCF model object of class `bcfmodel`.
359-
#' @param term A character string specifying the model term for which to compute intervals. Options for BCF models are `"prognostic_function"`, `"cate"`, `"variance_forest"`, `"rfx"`, or `"y_hat"`.
359+
#' @param terms A character string specifying the model term(s) for which to compute intervals. Options for BCF models are `"prognostic_function"`, `"cate"`, `"variance_forest"`, `"rfx"`, or `"y_hat"`.
360360
#' @param level A numeric value between 0 and 1 specifying the credible interval level (default is 0.95 for a 95% credible interval).
361361
#' @param scale (Optional) Scale of mean function predictions. Options are "linear", which returns predictions on the original scale of the mean forest / RFX terms, and "probability", which transforms predictions into a probability of observing `y == 1`. "probability" is only valid for models fit with a probit outcome model. Default: "linear".
362362
#' @param covariates (Optional) A matrix or data frame of covariates at which to compute the intervals. Required if the requested term depends on covariates (e.g., prognostic forest, CATE forest, variance forest, or overall predictions).
@@ -551,7 +551,7 @@ compute_bcf_posterior_interval <- function(
551551
#'
552552
#' This function computes posterior credible intervals for specified terms from a fitted BART model. It supports intervals for mean functions, variance functions, random effects, and overall predictions.
553553
#' @param model_object A fitted BART or BCF model object of class `bartmodel`.
554-
#' @param term A character string specifying the model term for which to compute intervals. Options for BART models are `"mean_forest"`, `"variance_forest"`, `"rfx"`, or `"y_hat"`.
554+
#' @param terms A character string specifying the model term(s) for which to compute intervals. Options for BART models are `"mean_forest"`, `"variance_forest"`, `"rfx"`, or `"y_hat"`.
555555
#' @param level A numeric value between 0 and 1 specifying the credible interval level (default is 0.95 for a 95% credible interval).
556556
#' @param scale (Optional) Scale of mean function predictions. Options are "linear", which returns predictions on the original scale of the mean forest / RFX terms, and "probability", which transforms predictions into a probability of observing `y == 1`. "probability" is only valid for models fit with a probit outcome model. Default: "linear".
557557
#' @param covariates A matrix or data frame of covariates at which to compute the intervals. Required if the requested term depends on covariates (e.g., mean forest, variance forest, or overall predictions).

R/stochtree-package.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -6,6 +6,7 @@
66
#' @importFrom stats predict
77
#' @importFrom stats qgamma
88
#' @importFrom stats qnorm
9+
#' @importFrom stats quantile
910
#' @importFrom stats pnorm
1011
#' @importFrom stats resid
1112
#' @importFrom stats rnorm

man/compute_bart_posterior_interval.Rd

Lines changed: 2 additions & 2 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/compute_bcf_posterior_interval.Rd

Lines changed: 2 additions & 2 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/predict.bartmodel.Rd

Lines changed: 2 additions & 2 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)