Revision aee422d7cd4098dad89e31ecc6dfd9e539d2bda4 authored by Dominique Makowski on 06 August 2019, 10:20:02 UTC, committed by cran-robot on 06 August 2019, 10:20:02 UTC
1 parent 23ea322
describe_prior.R
#' Describe Priors
#'
#' Returns a summary of the priors used in the model.
#'
#' @param model A Bayesian model.
#' @param ... Currently not used.
#'
#' @examples
#' \dontrun{
#' library(bayestestR)
#'
#' # rstanarm models
#' # -----------------------------------------------
#' library(rstanarm)
#' model <- rstanarm::stan_glm(mpg ~ wt + cyl, data = mtcars)
#' describe_prior(model)
#'
#' # brms models
#' # -----------------------------------------------
#' library(brms)
#' model <- brms::brm(mpg ~ wt + cyl, data = mtcars)
#' describe_prior(model)
#'
#' # BayesFactor objects
#' # -----------------------------------------------
#' library(BayesFactor)
#' bf <- ttestBF(x = rnorm(100, 1, 1))
#' describe_prior(bf)
#' }
#'
#' @importFrom insight get_priors
#'
#' @export
describe_prior <- function(model, ...) {
UseMethod("describe_prior")
}
#' @keywords internal
.describe_prior <- function(model, ...) {
priors <- insight::get_priors(model, ...)
# Format names
names(priors) <- tools::toTitleCase(names(priors))
names(priors)[-1] <- paste0("Prior_", names(priors)[-1])
# If the prior scale has been adjusted, it is the actual scale that was used.
if ("Prior_Adjusted_scale" %in% names(priors)) {
priors$Prior_Scale[!is.na(priors$Prior_Adjusted_scale)] <- priors$Prior_Adjusted_scale[!is.na(priors$Prior_Adjusted_scale)]
priors$Prior_Adjusted_scale <- NULL
}
priors
}
#' @export
describe_prior.stanreg <- .describe_prior
# #' @export
# describe_prior.brmsfit <- .describe_prior
#' @export
describe_prior.BFBayesFactor <- function(model, ...) {
priors <- insight::get_priors(model)
# Format names
names(priors) <- tools::toTitleCase(names(priors))
names(priors)[-1] <- paste0("Prior_", names(priors)[-1])
priors
}
Computing file changes ...