From ccdac30f3cb2efc65c2eddac490bbdbe73922244 Mon Sep 17 00:00:00 2001 From: jgabry Date: Wed, 6 Oct 2021 17:41:26 -0600 Subject: [PATCH 1/4] start adding ducos code --- NAMESPACE | 3 + R/mcmc-diagnostics.R | 142 ++++++++++++++++++++++++++++++++++++++-- man/MCMC-diagnostics.Rd | 13 +++- 3 files changed, 150 insertions(+), 8 deletions(-) diff --git a/NAMESPACE b/NAMESPACE index c6f52b31..9e9f3bd2 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -63,6 +63,9 @@ export(mcmc_hist) export(mcmc_hist_by_chain) export(mcmc_intervals) export(mcmc_intervals_data) +export(mcmc_mcse) +export(mcmc_mcse_data) +export(mcmc_mcse_hist) export(mcmc_neff) export(mcmc_neff_data) export(mcmc_neff_hist) diff --git a/R/mcmc-diagnostics.R b/R/mcmc-diagnostics.R index d2c65560..88a0dfe7 100644 --- a/R/mcmc-diagnostics.R +++ b/R/mcmc-diagnostics.R @@ -8,6 +8,10 @@ #' @name MCMC-diagnostics #' @family MCMC #' +#' @param ratio For effective sample size plots, a vector of *ratios* of +#' effective sample size estimates to total sample size. See [neff_ratio()]. +#' For MCSE plots, a vector of *ratios* of Monte Carlo standard error to +#' posterior standard deviation. See [mcse_ratio()]. #' @template args-hist #' @param size An optional value to override [ggplot2::geom_point()]'s #' default size (for `mcmc_rhat()`, `mcmc_neff()`) or @@ -210,8 +214,6 @@ mcmc_rhat_data <- function(rhat, ...) { #' @rdname MCMC-diagnostics #' @export -#' @param ratio A vector of *ratios* of effective sample size estimates to -#' total sample size. See [neff_ratio()]. #' mcmc_neff <- function(ratio, ..., size = NULL) { check_ignored_arguments(...) @@ -294,6 +296,93 @@ mcmc_neff_data <- function(ratio, ...) { diagnostic_data_frame(ratio) } +# monte carlo standard error ------------------------------------------- + +#' @rdname MCMC-diagnostics +#' @export +#' +mcmc_mcse <- function(ratio, ..., size = NULL) { + check_ignored_arguments(...) + data <- mcmc_mcse_data(ratio) + + max_ratio <- max(ratio, na.rm = TRUE) + if (max_ratio < 1.25) { + additional_breaks <- numeric(0) + } else if (max_ratio < 1.5) { + additional_breaks <- 1.25 + additional_labels <- "1.25" + } else { + additional_breaks <- seq(1.5, max_ratio, by = 0.5) + } + breaks <- c(0, 0.1, 0.25, 0.5, 0.75, 1, additional_breaks) + + ggplot( + data, + mapping = aes_( + x = ~ value, + y = ~ parameter, + color = ~ rating, + fill = ~ rating)) + + geom_segment( + aes_(yend = ~ parameter, xend = -Inf), + na.rm = TRUE) + + diagnostic_points(size) + + vline_at( + c(0.1, 0.5, 1), + color = "gray", + linetype = 2, + size = 0.25) + + labs(y = NULL, x = expression(mcse/sd)) + + scale_fill_diagnostic("mcse") + + scale_color_diagnostic("mcse") + + scale_x_continuous( + breaks = breaks, + # as.character truncates trailing zeroes, while ggplot default does not + labels = as.character(breaks), + limits = c(0, max(1, max_ratio) + 0.05), + expand = c(0, 0)) + + bayesplot_theme_get() + + yaxis_text(FALSE) + + yaxis_title(FALSE) + + yaxis_ticks(FALSE) +} + +#' @rdname MCMC-diagnostics +#' @export +mcmc_mcse_hist <- function(ratio, ..., binwidth = NULL, breaks = NULL) { + check_ignored_arguments(...) + data <- mcmc_mcse_data(ratio) + + ggplot( + data, + mapping = aes_( + x = ~ value, + color = ~ rating, + fill = ~ rating)) + + geom_histogram( + size = .25, + na.rm = TRUE, + binwidth = binwidth, + breaks = breaks) + + scale_color_diagnostic("mcse") + + scale_fill_diagnostic("mcse") + + labs(x = expression(mcse/sd), y = NULL) + + dont_expand_y_axis(c(0.005, 0)) + + yaxis_title(FALSE) + + yaxis_text(FALSE) + + yaxis_ticks(FALSE) + + bayesplot_theme_get() +} + +#' @rdname MCMC-diagnostics +#' @export +mcmc_mcse_data <- function(ratio, ...) { + check_ignored_arguments(...) + ratio <- drop_NAs_and_warn(new_mcse_ratio(ratio)) + diagnostic_data_frame(ratio) +} + + # autocorrelation --------------------------------------------------------- @@ -374,6 +463,12 @@ diagnostic_factor.neff_ratio <- function(x, breaks = c(0.1, 0.5)) { ordered_result = FALSE) } +diagnostic_factor.mcse_ratio <- function(x, breaks = c(0.05, 0.1)) { + cut(x, breaks = c(-Inf, breaks, Inf), + labels = c("low", "ok", "high"), + ordered_result = FALSE) +} + diagnostic_data_frame <- function(x) { x <- auto_name(sort(x)) stopifnot(!anyDuplicated(names(x))) @@ -411,17 +506,17 @@ diagnostic_points <- function(size = NULL) { # Functions wrapping around scale_color_manual() and scale_fill_manual(), used to # color the intervals by rhat value -scale_color_diagnostic <- function(diagnostic = c("rhat", "neff")) { +scale_color_diagnostic <- function(diagnostic = c("rhat", "neff", "mcse")) { d <- match.arg(diagnostic) diagnostic_color_scale(d, aesthetic = "color") } -scale_fill_diagnostic <- function(diagnostic = c("rhat", "neff")) { +scale_fill_diagnostic <- function(diagnostic = c("rhat", "neff", "mcse")) { d <- match.arg(diagnostic) diagnostic_color_scale(d, aesthetic = "fill") } -diagnostic_color_scale <- function(diagnostic = c("rhat", "neff_ratio"), +diagnostic_color_scale <- function(diagnostic = c("rhat", "neff_ratio", "mcse_ratio"), aesthetic = c("color", "fill")) { diagnostic <- match.arg(diagnostic) aesthetic <- match.arg(aesthetic) @@ -437,7 +532,7 @@ diagnostic_color_scale <- function(diagnostic = c("rhat", "neff_ratio"), ) } -diagnostic_colors <- function(diagnostic = c("rhat", "neff_ratio"), +diagnostic_colors <- function(diagnostic = c("rhat", "neff_ratio", "mcse_ratio"), aesthetic = c("color", "fill")) { diagnostic <- match.arg(diagnostic) aesthetic <- match.arg(aesthetic) @@ -445,6 +540,9 @@ diagnostic_colors <- function(diagnostic = c("rhat", "neff_ratio"), if (diagnostic == "neff_ratio") { color_levels <- rev(color_levels) } + if (diagnostic == "mcse_ratio") { + color_levels <- color_levels + } if (aesthetic == "color") { color_levels <- paste0(color_levels, "_highlight") } @@ -468,6 +566,11 @@ diagnostic_color_labels <- list( low = expression(N[eff] / N <= 0.1), ok = expression(N[eff] / N <= 0.5), high = expression(N[eff] / N > 0.5) + ), + mcse_ratio = c( + low = expression(mcse / sd <= 0.05), + ok = expression(mcse / sd <= 0.1), + high = expression(mcse / sd > 0.1) ) ) @@ -662,3 +765,30 @@ as_neff_ratio <- function(x) { as_neff_ratio(NextMethod()) } +new_mcse_ratio <- function(x) { + # Convert a 1-d arrays to a vectors + if (is.array(x) && length(dim(x)) == 1) { + x <- as.vector(x) + } + as_mcse_ratio(validate_mcse_ratio(x)) +} + +validate_mcse_ratio <- function(x) { + stopifnot(is.numeric(x), !is.list(x), !is.array(x)) + if (any(x < 0, na.rm = TRUE)) { + abort("All mcse ratios must be positive.") + } + x +} + +as_mcse_ratio <- function(x) { + structure(x, class = c("mcse_ratio", "numeric"), names = names(x)) +} + +#' Indexing method -- needed so that sort, etc. don't strip names. +#' @export +#' @keywords internal +#' @noRd +`[.mcse_ratio` <- function (x, i, j, drop = TRUE, ...) { + as_mcse_ratio(NextMethod()) +} diff --git a/man/MCMC-diagnostics.Rd b/man/MCMC-diagnostics.Rd index 1ca79914..04e9b7b4 100644 --- a/man/MCMC-diagnostics.Rd +++ b/man/MCMC-diagnostics.Rd @@ -8,6 +8,9 @@ \alias{mcmc_neff} \alias{mcmc_neff_hist} \alias{mcmc_neff_data} +\alias{mcmc_mcse} +\alias{mcmc_mcse_hist} +\alias{mcmc_mcse_data} \alias{mcmc_acf} \alias{mcmc_acf_bar} \title{General MCMC diagnostics} @@ -24,6 +27,12 @@ mcmc_neff_hist(ratio, ..., binwidth = NULL, breaks = NULL) mcmc_neff_data(ratio, ...) +mcmc_mcse(ratio, ..., size = NULL) + +mcmc_mcse_hist(ratio, ..., binwidth = NULL, breaks = NULL) + +mcmc_mcse_data(ratio, ...) + mcmc_acf( x, pars = character(), @@ -58,8 +67,8 @@ the default binwidth.} \item{breaks}{Passed to \code{\link[ggplot2:geom_histogram]{ggplot2::geom_histogram()}} as an alternative to \code{binwidth}.} -\item{ratio}{A vector of \emph{ratios} of effective sample size estimates to -total sample size. See \code{\link[=neff_ratio]{neff_ratio()}}.} +\item{ratio}{A vector of \emph{ratios} of monte carlo standard error to +posterior standard deviation. See \code{\link[=mcse_ratio]{mcse_ratio()}}.} \item{x}{An object containing MCMC draws: \itemize{ From adecf0bfc72de54e3d0b698fd6925d775708be69 Mon Sep 17 00:00:00 2001 From: jgabry Date: Wed, 6 Oct 2021 18:14:46 -0600 Subject: [PATCH 2/4] redo mcse plots branch --- NAMESPACE | 1 + R/mcmc-diagnostics.R | 50 +++-- man/MCMC-diagnostics.Rd | 36 +++- .../mcmc-diagnostics/mcmc-mcse-default.svg | 171 +++++++++++++++++ .../mcmc-mcse-hist-default.svg | 179 ++++++++++++++++++ tests/testthat/test-mcmc-diagnostics.R | 43 ++++- 6 files changed, 450 insertions(+), 30 deletions(-) create mode 100644 tests/testthat/_snaps/mcmc-diagnostics/mcmc-mcse-default.svg create mode 100644 tests/testthat/_snaps/mcmc-diagnostics/mcmc-mcse-hist-default.svg diff --git a/NAMESPACE b/NAMESPACE index 9e9f3bd2..45933dcf 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -1,5 +1,6 @@ # Generated by roxygen2: do not edit by hand +S3method("[",mcse_ratio) S3method("[",neff_ratio) S3method("[",rhat) S3method(log_posterior,CmdStanMCMC) diff --git a/R/mcmc-diagnostics.R b/R/mcmc-diagnostics.R index 88a0dfe7..d166c1f4 100644 --- a/R/mcmc-diagnostics.R +++ b/R/mcmc-diagnostics.R @@ -1,17 +1,18 @@ #' General MCMC diagnostics #' #' Plots of Rhat statistics, ratios of effective sample size to total sample -#' size, and autocorrelation of MCMC draws. See the **Plot Descriptions** -#' section, below, for details. For models fit using the No-U-Turn-Sampler, see -#' also [MCMC-nuts] for additional MCMC diagnostic plots. +#' size, ratios of MCSE to posterior SD, and autocorrelation of MCMC draws. See +#' the **Plot Descriptions** section, below, for details. For models fit using +#' the No-U-Turn-Sampler, see also [MCMC-nuts] for additional MCMC diagnostic +#' plots. #' #' @name MCMC-diagnostics #' @family MCMC #' #' @param ratio For effective sample size plots, a vector of *ratios* of -#' effective sample size estimates to total sample size. See [neff_ratio()]. -#' For MCSE plots, a vector of *ratios* of Monte Carlo standard error to -#' posterior standard deviation. See [mcse_ratio()]. +#' effective sample size estimates to total sample sizes (see [neff_ratio()]). +#' For MCSE plots, a vector of *ratios* of Monte Carlo standard errors to +#' posterior standard deviations. #' @template args-hist #' @param size An optional value to override [ggplot2::geom_point()]'s #' default size (for `mcmc_rhat()`, `mcmc_neff()`) or @@ -36,9 +37,19 @@ #' histogram. Values are colored using different shades (lighter is better). #' The chosen thresholds are somewhat arbitrary, but can be useful guidelines #' in practice. -#' * _light_: between 0.5 and 1 (high) -#' * _mid_: between 0.1 and 0.5 (good) -#' * _dark_: below 0.1 (low) +#' * _light_: between 0.5 and 1 (good) +#' * _mid_: between 0.1 and 0.5 (ok) +#' * _dark_: below 0.1 (too low) +#' } +#' +#' \item{`mcmc_mcse()`, `mcmc_mcse_hist()`}{ +#' Ratios of Monte Carlo standard errors to posterior standard deviations as +#' either points or a histogram. Values are colored using different shades +#' (lighter is better). The chosen thresholds are somewhat arbitrary, but can +#' be useful guidelines in practice. +#' * _light_: below 0.05 (good) +#' * _mid_: between 0.05 and 0.1 (ok) +#' * _dark_: above 0.1 (too high) #' } #' #' \item{`mcmc_acf()`, `mcmc_acf_bar()`}{ @@ -95,6 +106,11 @@ #' mcmc_neff_hist(ratio) #' mcmc_neff(ratio) #' +#' # fake mcse ratio values to use for demonstration +#' ratio <- c(runif(100, 0, 1.5)) +#' mcmc_mcse_hist(ratio) +#' mcmc_mcse(ratio) +#' #' \dontrun{ #' # Example using rstanarm model (requires rstanarm package) #' library(rstanarm) @@ -443,7 +459,7 @@ mcmc_acf_bar <- #' #' @param x A numeric vector. #' @param breaks A numeric vector of length two. The resulting factor variable -#' will have three levels ('low', 'ok', and 'high') corresponding to ( +#' will have three levels ('low', 'mid', and 'high') corresponding to ( #' `x <= breaks[1]`, `breaks[1] < x <= breaks[2]`, `x > breaks[2]`). #' @return A factor the same length as `x` with three levels. #' @noRd @@ -453,19 +469,19 @@ diagnostic_factor <- function(x, breaks, ...) { diagnostic_factor.rhat <- function(x, breaks = c(1.05, 1.1)) { cut(x, breaks = c(-Inf, breaks, Inf), - labels = c("low", "ok", "high"), + labels = c("low", "mid", "high"), ordered_result = FALSE) } diagnostic_factor.neff_ratio <- function(x, breaks = c(0.1, 0.5)) { cut(x, breaks = c(-Inf, breaks, Inf), - labels = c("low", "ok", "high"), + labels = c("low", "mid", "high"), ordered_result = FALSE) } diagnostic_factor.mcse_ratio <- function(x, breaks = c(0.05, 0.1)) { cut(x, breaks = c(-Inf, breaks, Inf), - labels = c("low", "ok", "high"), + labels = c("low", "mid", "high"), ordered_result = FALSE) } @@ -553,23 +569,23 @@ diagnostic_colors <- function(diagnostic = c("rhat", "neff_ratio", "mcse_ratio") aesthetic = aesthetic, color_levels = color_levels, color_labels = color_labels, - values = set_names(get_color(color_levels), c("low", "ok", "high"))) + values = set_names(get_color(color_levels), c("low", "mid", "high"))) } diagnostic_color_labels <- list( rhat = c( low = expression(hat(R) <= 1.05), - ok = expression(hat(R) <= 1.10), + mid = expression(hat(R) <= 1.10), high = expression(hat(R) > 1.10) ), neff_ratio = c( low = expression(N[eff] / N <= 0.1), - ok = expression(N[eff] / N <= 0.5), + mid = expression(N[eff] / N <= 0.5), high = expression(N[eff] / N > 0.5) ), mcse_ratio = c( low = expression(mcse / sd <= 0.05), - ok = expression(mcse / sd <= 0.1), + mid = expression(mcse / sd <= 0.1), high = expression(mcse / sd > 0.1) ) ) diff --git a/man/MCMC-diagnostics.Rd b/man/MCMC-diagnostics.Rd index 04e9b7b4..cbbd2841 100644 --- a/man/MCMC-diagnostics.Rd +++ b/man/MCMC-diagnostics.Rd @@ -67,8 +67,10 @@ the default binwidth.} \item{breaks}{Passed to \code{\link[ggplot2:geom_histogram]{ggplot2::geom_histogram()}} as an alternative to \code{binwidth}.} -\item{ratio}{A vector of \emph{ratios} of monte carlo standard error to -posterior standard deviation. See \code{\link[=mcse_ratio]{mcse_ratio()}}.} +\item{ratio}{For effective sample size plots, a vector of \emph{ratios} of +effective sample size estimates to total sample sizes (see \code{\link[=neff_ratio]{neff_ratio()}}). +For MCSE plots, a vector of \emph{ratios} of Monte Carlo standard errors to +posterior standard deviations.} \item{x}{An object containing MCMC draws: \itemize{ @@ -108,9 +110,10 @@ function. } \description{ Plots of Rhat statistics, ratios of effective sample size to total sample -size, and autocorrelation of MCMC draws. See the \strong{Plot Descriptions} -section, below, for details. For models fit using the No-U-Turn-Sampler, see -also \link{MCMC-nuts} for additional MCMC diagnostic plots. +size, ratios of MCSE to posterior SD, and autocorrelation of MCMC draws. See +the \strong{Plot Descriptions} section, below, for details. For models fit using +the No-U-Turn-Sampler, see also \link{MCMC-nuts} for additional MCMC diagnostic +plots. } \section{Plot Descriptions}{ @@ -132,9 +135,21 @@ histogram. Values are colored using different shades (lighter is better). The chosen thresholds are somewhat arbitrary, but can be useful guidelines in practice. \itemize{ -\item \emph{light}: between 0.5 and 1 (high) -\item \emph{mid}: between 0.1 and 0.5 (good) -\item \emph{dark}: below 0.1 (low) +\item \emph{light}: between 0.5 and 1 (good) +\item \emph{mid}: between 0.1 and 0.5 (ok) +\item \emph{dark}: below 0.1 (too low) +} +} + +\item{\code{mcmc_mcse()}, \code{mcmc_mcse_hist()}}{ +Ratios of Monte Carlo standard errors to posterior standard deviations as +either points or a histogram. Values are colored using different shades +(lighter is better). The chosen thresholds are somewhat arbitrary, but can +be useful guidelines in practice. +\itemize{ +\item \emph{light}: below 0.05 (good) +\item \emph{mid}: between 0.05 and 0.1 (ok) +\item \emph{dark}: above 0.1 (too high) } } @@ -181,6 +196,11 @@ ratio <- c(runif(100, 0, 1)) mcmc_neff_hist(ratio) mcmc_neff(ratio) +# fake mcse ratio values to use for demonstration +ratio <- c(runif(100, 0, 1.5)) +mcmc_mcse_hist(ratio) +mcmc_mcse(ratio) + \dontrun{ # Example using rstanarm model (requires rstanarm package) library(rstanarm) diff --git a/tests/testthat/_snaps/mcmc-diagnostics/mcmc-mcse-default.svg b/tests/testthat/_snaps/mcmc-diagnostics/mcmc-mcse-default.svg new file mode 100644 index 00000000..956a1c9f --- /dev/null +++ b/tests/testthat/_snaps/mcmc-diagnostics/mcmc-mcse-default.svg @@ -0,0 +1,171 @@ + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + +0 +0.1 +0.25 +0.5 +0.75 +1 +1.5 +m +c +s +e + +s +d + + + + + + +m +c +s +e + +s +d + +0.05 +m +c +s +e + +s +d + +0.1 +m +c +s +e + +s +d +> +0.1 +mcmc_mcse (default) + + diff --git a/tests/testthat/_snaps/mcmc-diagnostics/mcmc-mcse-hist-default.svg b/tests/testthat/_snaps/mcmc-diagnostics/mcmc-mcse-hist-default.svg new file mode 100644 index 00000000..ac9cd10c --- /dev/null +++ b/tests/testthat/_snaps/mcmc-diagnostics/mcmc-mcse-hist-default.svg @@ -0,0 +1,179 @@ + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + +0.0 +0.5 +1.0 +1.5 +2.0 + + + + + + + + + + +0.0 +0.5 +1.0 +1.5 +m +c +s +e + +s +d + + + +m +c +s +e + +s +d + +0.05 +m +c +s +e + +s +d + +0.1 +m +c +s +e + +s +d +> +0.1 +mcmc_mcse_hist (default) + + diff --git a/tests/testthat/test-mcmc-diagnostics.R b/tests/testthat/test-mcmc-diagnostics.R index a3bd0085..ef976906 100644 --- a/tests/testthat/test-mcmc-diagnostics.R +++ b/tests/testthat/test-mcmc-diagnostics.R @@ -3,7 +3,7 @@ context("MCMC: diagnostics") source(test_path("data-for-mcmc-tests.R")) -test_that("rhat and neff plots return a ggplot object", { +test_that("rhat, neff, and mcse plots return a ggplot object", { rhat <- runif(100, 1, 1.5) expect_gg(mcmc_rhat(rhat)) expect_gg(mcmc_rhat_hist(rhat)) @@ -12,35 +12,45 @@ test_that("rhat and neff plots return a ggplot object", { expect_gg(mcmc_neff(ratio)) expect_gg(mcmc_neff_hist(ratio)) + expect_gg(mcmc_mcse(ratio)) + expect_gg(mcmc_mcse(ratio)) + # 1-D array ok expect_gg(mcmc_rhat(array(rhat))) expect_gg(mcmc_rhat_hist(array(rhat))) expect_gg(mcmc_neff(array(ratio))) expect_gg(mcmc_neff_hist(array(ratio))) + expect_gg(mcmc_mcse(array(ratio))) + expect_gg(mcmc_mcse_hist(array(ratio))) # named ok rhat <- setNames(runif(5, 1, 1.5), paste0("alpha[", 1:5, "]")) expect_gg(mcmc_rhat(rhat)) }) -test_that("rhat and neff plot functions throw correct errors & warnings", { +test_that("rhat, neff, and mcse plot functions throw correct errors & warnings", { # need vector or 1D array expect_error(mcmc_rhat_hist(cbind(1:2)), "is.array") expect_error(mcmc_neff_hist(list(1,2)), "is.numeric") + expect_error(mcmc_mcse_hist(list(1,2)), "is.numeric") # need positive rhat values expect_error(mcmc_rhat(c(-1, 1, 1)), "must be positive") + # need positive mcse values + expect_error(mcmc_mcse(c(-1, 1, 1)), "must be positive") + # need ratios between 0 and 1 expect_error(mcmc_neff(c(-1, 0.5, 0.7)), "must be positive") # drop NAs and warn expect_warning(mcmc_rhat(c(1, 1, NA)), "Dropped 1 NAs") expect_warning(mcmc_neff(c(0.2, NA, 1, NA)), "Dropped 2 NAs") + expect_warning(mcmc_mcse(c(0.2, NA, 1, NA)), "Dropped 2 NAs") }) -test_that("duplicated rhats and neffs are kept (#105)", { +test_that("duplicated rhats, neffs, mcses are kept (#105)", { # https://github.com/stan-dev/bayesplot/issues/105 rhats <- runif(3, 1, 1.2) rhats <- c(rhats, rhats, rhats) @@ -51,13 +61,16 @@ test_that("duplicated rhats and neffs are kept (#105)", { ratios <- c(ratios, ratios, ratios) df <- mcmc_neff_data(ratios) expect_equal(nrow(df), length(ratios)) + + df <- mcmc_mcse_data(ratios) + expect_equal(nrow(df), length(ratios)) }) test_that("'description' & 'rating' columns are correct (#176)", { # https://github.com/stan-dev/bayesplot/issues/176 rhats <- c(1, 1.07, 1.19, 1.07, 1.3, 1) expected_rhats <- sort(rhats) - expected_ratings <- rep(c("low", "ok", "high"), each = 2) + expected_ratings <- rep(c("low", "mid", "high"), each = 2) expected_descriptions <- rep(c("hat(R) <= 1.05", "hat(R) <= 1.1", "hat(R) > 1.1"), each = 2) @@ -68,7 +81,7 @@ test_that("'description' & 'rating' columns are correct (#176)", { ratios <- c(0.4, 0.05, 0.6) expected_ratios <- sort(ratios) - expected_ratings <- c("low", "ok", "high") + expected_ratings <- c("low", "mid", "high") expected_descriptions <- c("N[eff]/N <= 0.1", "N[eff]/N <= 0.5", "N[eff]/N > 0.5") @@ -151,3 +164,23 @@ test_that("mcmc_neff_hist renders correctly", { p_binwidth <- mcmc_neff_hist(neffs, binwidth = .05) vdiffr::expect_doppelganger("mcmc_neff_hist (binwidth)", p_binwidth) }) + +test_that("mcmc_mcse renders correctly", { + testthat::skip_on_cran() + testthat::skip_if_not_installed("vdiffr") + + mcses <- seq(from = 0, to = 1.5, length.out = 40) + + p_base <- mcmc_mcse(mcses) + vdiffr::expect_doppelganger("mcmc_mcse (default)", p_base) +}) + +test_that("mcmc_mcse_hist renders correctly", { + testthat::skip_on_cran() + testthat::skip_if_not_installed("vdiffr") + + mcses <- seq(from = 0, to = 1.5, length.out = 40) + + p_base <- mcmc_mcse_hist(mcses) + vdiffr::expect_doppelganger("mcmc_mcse_hist (default)", p_base) +}) From 277094a0daa6a61c01ef8679abdc98d2e1c908ff Mon Sep 17 00:00:00 2001 From: jgabry Date: Wed, 6 Oct 2021 18:21:26 -0600 Subject: [PATCH 3/4] add NEWS entry and credit to @VeenDuco --- NEWS.md | 4 ++++ 1 file changed, 4 insertions(+) diff --git a/NEWS.md b/NEWS.md index d6d21214..b1539213 100644 --- a/NEWS.md +++ b/NEWS.md @@ -12,6 +12,10 @@ * `mcmc_areas()` and `mcmc_areas_ridges()` gain an argument `border_size` for controlling the thickness of the ridgelines. (#224) +* New plotting functions `mcmc_mcse()` and `mcmc_mcse_hist()` that are similar +to `mcmc_neff()` and `mcmc_neff_hist()` but for plotting ratios of MCSE to +posterior SD. (#278, @VeenDuco) + * New plotting function `ppc_km_overlay_grouped()`, the grouped variant of `ppc_km_overlay()`. (#260, @fweber144) From b5494ccf1b6dcf685f31dfb89441bbf897bc0284 Mon Sep 17 00:00:00 2001 From: jgabry Date: Wed, 6 Oct 2021 18:31:03 -0600 Subject: [PATCH 4/4] Update test-helpers-mcmc.R --- tests/testthat/test-helpers-mcmc.R | 8 ++++---- 1 file changed, 4 insertions(+), 4 deletions(-) diff --git a/tests/testthat/test-helpers-mcmc.R b/tests/testthat/test-helpers-mcmc.R index f346f420..f80c112f 100644 --- a/tests/testthat/test-helpers-mcmc.R +++ b/tests/testthat/test-helpers-mcmc.R @@ -299,20 +299,20 @@ test_that("tidy parameter selection throws correct errors", { # rhat and neff helpers --------------------------------------------------- test_that("diagnostic_factor.rhat works", { rhats <- new_rhat(c(low = 0.99, low = 1, low = 1.01, - ok = 1.06, ok = 1.09, ok = 1.1, + mid = 1.06, mid = 1.09, mid = 1.1, high = 1.2, high = 1.7)) r <- diagnostic_factor(unname(rhats)) expect_equivalent(r, as.factor(names(rhats))) - expect_identical(levels(r), c("low", "ok", "high")) + expect_identical(levels(r), c("low", "mid", "high")) }) test_that("diagnostic_factor.neff_ratio works", { ratios <- new_neff_ratio(c(low = 0.05, low = 0.01, - ok = 0.2, ok = 0.49, + mid = 0.2, mid = 0.49, high = 0.51, high = 0.99, high = 1)) r <- diagnostic_factor(unname(ratios)) expect_equivalent(r, as.factor(names(ratios))) - expect_identical(levels(r), c("low", "ok", "high")) + expect_identical(levels(r), c("low", "mid", "high")) })