From 1a090e10a3943588b78889dfb0ca365928992bfe Mon Sep 17 00:00:00 2001 From: Daniel Date: Wed, 27 Mar 2024 14:06:10 +0100 Subject: [PATCH] add args to set axis titles (#334) * add args to set axis titles * version * fix * more args * fix * fix --- DESCRIPTION | 3 +- R/plot.binned_residuals.R | 8 +- R/plot.check_collinearity.R | 10 +- R/plot.check_heteroscedasticity.R | 19 +- R/plot.check_homogeneity.R | 6 +- R/plot.check_model.R | 58 ++- R/plot.check_normality.R | 50 ++- R/plot.check_outliers.R | 6 + R/plot.check_outliers_new.R | 10 +- R/plot.check_overdisp.R | 16 +- R/plot.check_predictions.R | 42 +- R/plot.performance_simres.R | 8 +- man/plot.see_check_collinearity.Rd | 5 +- man/plot.see_check_heteroscedasticity.Rd | 14 +- man/plot.see_check_normality.Rd | 9 +- man/plot.see_check_outliers.Rd | 6 + man/plot.see_performance_simres.Rd | 9 +- man/print.see_performance_pp_check.Rd | 20 +- .../check_model/check-model-works-for-lm.svg | 144 +++---- tests/vdiffr.Rout.fail | 370 ++++++++++++++++++ 20 files changed, 683 insertions(+), 130 deletions(-) create mode 100644 tests/vdiffr.Rout.fail diff --git a/DESCRIPTION b/DESCRIPTION index 5e2fb3e49..3d0f7ec9f 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Type: Package Package: see Title: Model Visualisation Toolbox for 'easystats' and 'ggplot2' -Version: 0.8.3.2 +Version: 0.8.3.3 Authors@R: c(person(given = "Daniel", family = "Lüdecke", @@ -119,3 +119,4 @@ Config/Needs/website: r-lib/pkgdown, easystats/easystatstemplate Config/rcmdcheck/ignore-inconsequential-notes: true +Remotes: easystats/performance diff --git a/R/plot.binned_residuals.R b/R/plot.binned_residuals.R index 5a098a534..fe357f6ae 100644 --- a/R/plot.binned_residuals.R +++ b/R/plot.binned_residuals.R @@ -2,10 +2,12 @@ plot.see_binned_residuals <- function(x, size_line = 0.7, size_point = 2.2, + size_title = 12, + size_axis_title = base_size, + base_size = 10, colors = social_colors(c("blue", "red", "green")), show_smooth = FALSE, style = theme_lucid, - base_size = 10, ...) { x$se.lo <- -x$se if (length(unique(x$group)) > 1L) { @@ -108,7 +110,9 @@ plot.see_binned_residuals <- function(x, p <- p + theme_style( base_size = base_size, plot.title.space = 3, - axis.title.space = 5 + axis.title.space = 5, + axis.title.size = size_axis_title, + plot.title.size = size_title ) } diff --git a/R/plot.check_collinearity.R b/R/plot.check_collinearity.R index 06be132c0..62284d4a9 100644 --- a/R/plot.check_collinearity.R +++ b/R/plot.check_collinearity.R @@ -20,6 +20,8 @@ plot.see_check_collinearity <- function(x, colors = c("#3aaf85", "#1b6ca8", "#cd201f"), size_point = 3.5, size_line = 0.8, + size_title = 12, + size_axis_title = base_size, base_size = 10, ...) { if (is.null(data)) { @@ -52,6 +54,8 @@ plot.see_check_collinearity <- function(x, dat, size_point = size_point, size_line = size_line, + size_title = size_title, + size_axis_title = size_axis_title, base_size = base_size, colors = colors, ci_data = attributes(x)$CI, @@ -64,6 +68,8 @@ plot.see_check_collinearity <- function(x, size_point, size_line, theme_style = theme_lucid, + size_title = 12, + size_axis_title = 10, base_size = 10, colors = unname(social_colors(c("green", "blue", "red"))), ci_data = NULL, @@ -166,7 +172,9 @@ plot.see_check_collinearity <- function(x, theme_style( base_size = base_size, plot.title.space = 3, - axis.title.space = 5 + axis.title.space = 5, + plot.title.size = size_title, + axis.title.size = size_axis_title ) + ggplot2::scale_y_continuous( limits = c(1, ylim * 1.15), diff --git a/R/plot.check_heteroscedasticity.R b/R/plot.check_heteroscedasticity.R index 9d6642dcd..6809f114d 100644 --- a/R/plot.check_heteroscedasticity.R +++ b/R/plot.check_heteroscedasticity.R @@ -16,7 +16,14 @@ #' result #' plot(result, data = m) # data required for pkgdown #' @export -plot.see_check_heteroscedasticity <- function(x, data = NULL, size_point = 2, size_line = 0.8, base_size = 10, ...) { +plot.see_check_heteroscedasticity <- function(x, + data = NULL, + size_point = 2, + size_line = 0.8, + size_title = 12, + size_axis_title = base_size, + base_size = 10, + ...) { if (is.null(data)) { model <- .retrieve_data(x) } else { @@ -69,7 +76,15 @@ plot.see_check_heteroscedasticity <- function(x, data = NULL, size_point = 2, si x = stats::fitted(model), y = sqrt(abs(r)) ) - .plot_diag_homogeneity(dat, size_point = size_point, size_line = size_line, base_size = base_size, ...) + .plot_diag_homogeneity( + dat, + size_point = size_point, + size_line = size_line, + base_size = base_size, + size_title = size_title, + size_axis_title = size_axis_title, + ... + ) } diff --git a/R/plot.check_homogeneity.R b/R/plot.check_homogeneity.R index ef9bb5e87..d5bfe9df2 100644 --- a/R/plot.check_homogeneity.R +++ b/R/plot.check_homogeneity.R @@ -134,6 +134,8 @@ plot.see_check_homogeneity <- function(x, data = NULL, ...) { size_line, alpha_level = 0.2, theme_style = theme_lucid, + size_title = 12, + size_axis_title = 10, base_size = 10, colors = unname(social_colors(c("green", "blue", "red"))), dot_alpha_level = 0.8, @@ -167,6 +169,8 @@ plot.see_check_homogeneity <- function(x, data = NULL, ...) { theme_style( base_size = base_size, plot.title.space = 3, - axis.title.space = 5 + axis.title.space = 5, + plot.title.size = size_title, + axis.title.size = size_axis_title ) } diff --git a/R/plot.check_model.R b/R/plot.check_model.R index eb5e101c2..05e683b8b 100644 --- a/R/plot.check_model.R +++ b/R/plot.check_model.R @@ -35,6 +35,8 @@ plot.see_check_model <- function(x, show_labels <- attr(x, "show_labels") %||% TRUE size_text <- attr(x, "text_size") base_size <- attr(x, "base_size") + size_axis_title <- attr(x, "axis_title_size") + size_title <- attr(x, "title_size") alpha_level <- attr(x, "alpha") dot_alpha_level <- attr(x, "dot_alpha") show_dots <- attr(x, "show_dots") @@ -79,6 +81,14 @@ plot.see_check_model <- function(x, base_size <- 10 } + if (is.null(size_axis_title)) { + size_axis_title <- base_size + } + + if (is.null(size_title)) { + size_title <- 12 + } + if (is.null(check)) { check <- "all" } @@ -94,6 +104,8 @@ plot.see_check_model <- function(x, size_line = size_line, size_point = size_point, base_size = base_size, + size_axis_title = size_axis_title, + size_title = size_title, type = type, check_model = TRUE, adjust_legend = TRUE, @@ -104,11 +116,13 @@ plot.see_check_model <- function(x, if ("NCV" %in% names(x) && !is.null(x$NCV) && any(c("ncv", "linearity", "all") %in% check)) { p$NCV <- .plot_diag_linearity( x$NCV, - size_point, - size_line, - alpha_level, + size_point = size_point, + size_line = size_line, + alpha_level = alpha_level, theme_style = style, base_size = base_size, + size_axis_title = size_axis_title, + size_title = size_title, colors = colors, dot_alpha_level = dot_alpha_level, show_dots = show_dots @@ -121,6 +135,8 @@ plot.see_check_model <- function(x, x$BINNED_RESID, style = style, base_size = base_size, + size_axis_title = size_axis_title, + size_title = size_title, colors = colors[c(2, 3, 1)], adjust_legend = TRUE, check_model = TRUE, @@ -133,6 +149,8 @@ plot.see_check_model <- function(x, x$OVERDISPERSION, style = style, base_size = base_size, + size_axis_title = size_axis_title, + size_title = size_title, colors = colors[c(1, 2)], size_line = size_line, type = overdisp_type @@ -142,11 +160,13 @@ plot.see_check_model <- function(x, if ("HOMOGENEITY" %in% names(x) && !is.null(x$HOMOGENEITY) && any(c("homogeneity", "all") %in% check)) { p$HOMOGENEITY <- .plot_diag_homogeneity( x$HOMOGENEITY, - size_point, - size_line, - alpha_level, + size_point = size_point, + size_line = size_line, + alpha_level = alpha_level, theme_style = style, base_size = base_size, + size_axis_title = size_axis_title, + size_title = size_title, colors = colors, dot_alpha_level = dot_alpha_level, show_dots = show_dots @@ -161,6 +181,8 @@ plot.see_check_model <- function(x, size_line = size_line, size_point = size_point, theme_style = style, + size_axis_title = size_axis_title, + size_title = size_title, base_size = base_size, colors = colors, dot_alpha_level = dot_alpha_level, @@ -175,6 +197,8 @@ plot.see_check_model <- function(x, size_line = size_line, theme_style = style, base_size = base_size, + size_axis_title = size_axis_title, + size_title = size_title, colors = colors, ci_data = attributes(x$VIF)$CI, is_check_model = TRUE @@ -192,13 +216,17 @@ plot.see_check_model <- function(x, colors = colors, detrend = detrend, style = style, - base_size = base_size + base_size = base_size, + size_axis_title = size_axis_title, + size_title = size_title ) } else { p$QQ <- .plot_diag_qq( x$QQ, - size_point, - size_line, + size_point = size_point, + size_line = size_line, + size_axis_title = size_axis_title, + size_title = size_title, alpha_level = alpha_level, detrend = detrend, theme_style = style, @@ -215,10 +243,12 @@ plot.see_check_model <- function(x, if ("NORM" %in% names(x) && !is.null(x$NORM) && any(c("normality", "all") %in% check)) { p$NORM <- .plot_diag_norm( x$NORM, - size_line, + size_line = size_line, alpha_level = alpha_level, theme_style = style, base_size = base_size, + size_axis_title = size_axis_title, + size_title = size_title, colors = colors ) } @@ -228,6 +258,8 @@ plot.see_check_model <- function(x, x$REQQ, size_point, size_line, + size_axis_title = size_axis_title, + size_title = size_title, alpha_level = alpha_level, theme_style = style, base_size = base_size, @@ -254,6 +286,8 @@ plot.see_check_model <- function(x, .plot_diag_linearity <- function(x, size_point, size_line, + size_axis_title = 10, + size_title = 12, alpha_level = 0.2, theme_style = theme_lucid, base_size = 10, @@ -290,6 +324,8 @@ plot.see_check_model <- function(x, theme_style( base_size = base_size, plot.title.space = 3, - axis.title.space = 5 + axis.title.space = 5, + axis.title.size = size_axis_title, + plot.title.size = size_title ) } diff --git a/R/plot.check_normality.R b/R/plot.check_normality.R index abdd20e0d..f7a0b4cee 100644 --- a/R/plot.check_normality.R +++ b/R/plot.check_normality.R @@ -19,7 +19,8 @@ #' be one of `"pointwise"` or `"boot"` for pointwise confidence bands, or #' `"ks"` or `"ts"` for simultaneous testing. See `qqplotr::stat_qq_band()` #' for details. -#' @param base_size Base font size for plots. +#' @param base_size,size_axis_title,size_title Numeric value specifying size of +#' axis and plot titles. #' @inheritParams data_plot #' @inheritParams plot.see_bayesfactor_parameters #' @@ -43,9 +44,11 @@ plot.see_check_normality <- function(x, data = NULL, size_line = 0.8, size_point = 2, + size_title = 12, + size_axis_title = base_size, + base_size = 10, alpha = 0.2, dot_alpha = 0.8, - base_size = 10, colors = c("#3aaf85", "#1b6ca8"), detrend = TRUE, method = "ell", @@ -69,7 +72,10 @@ plot.see_check_normality <- function(x, attributes(x)$re_qq, size_point = size_point, size_line = size_line, - alpha_level = alpha + alpha_level = alpha, + size_axis_title = size_axis_title, + size_title = size_title, + base_size = base_size ) } else { if (type == "qq") { # nolint @@ -109,6 +115,9 @@ plot.see_check_normality <- function(x, dat, size_point = size_point, size_line = size_line, + size_axis_title = size_axis_title, + size_title = size_title, + base_size = base_size, alpha_level = alpha, detrend = detrend, dot_alpha_level = dot_alpha, @@ -131,7 +140,14 @@ plot.see_check_normality <- function(x, mean(r), stats::sd(r) ) - .plot_diag_norm(dat, size_line = size_line, alpha_level = alpha, base_size = base_size) + .plot_diag_norm( + dat, + size_line = size_line, + alpha_level = alpha, + base_size = base_size, + size_axis_title = size_axis_title, + size_title = size_title + ) } else if (type == "pp") { x <- suppressMessages(sort(stats::residuals(model), na.last = NA)) dat <- data.frame(res = x) @@ -140,6 +156,8 @@ plot.see_check_normality <- function(x, size_point = size_point, size_line = size_line, base_size = base_size, + size_axis_title = size_axis_title, + size_title = size_title, alpha_level = alpha, detrend = detrend, dot_alpha_level = dot_alpha, @@ -154,6 +172,8 @@ plot.see_check_normality <- function(x, .plot_diag_norm <- function(x, size_line, + size_axis_title = 10, + size_title = 12, alpha_level = 0.2, theme_style = theme_lucid, base_size = 10, @@ -181,7 +201,9 @@ plot.see_check_normality <- function(x, theme_style( base_size = base_size, plot.title.space = 3, - axis.title.space = 5 + axis.title.space = 5, + plot.title.size = size_title, + axis.title.size = size_axis_title ) + ggplot2::scale_y_continuous(labels = NULL) } @@ -192,6 +214,8 @@ plot.see_check_normality <- function(x, .plot_diag_qq <- function(x, size_point, size_line, + size_axis_title = 10, + size_title = 12, alpha_level = 0.2, detrend = FALSE, method = "ell", @@ -301,7 +325,9 @@ plot.see_check_normality <- function(x, theme_style( base_size = base_size, plot.title.space = 3, - axis.title.space = 5 + axis.title.space = 5, + plot.title.size = size_title, + axis.title.size = size_axis_title ) } @@ -311,6 +337,8 @@ plot.see_check_normality <- function(x, .plot_diag_pp <- function(x, size_point, size_line, + size_axis_title = base_size, + size_title = 12, alpha_level = 0.2, detrend = FALSE, method = "ell", @@ -370,7 +398,9 @@ plot.see_check_normality <- function(x, theme_style( base_size = base_size, plot.title.space = 3, - axis.title.space = 5 + axis.title.space = 5, + plot.title.size = size_title, + axis.title.size = size_axis_title ) } @@ -380,6 +410,8 @@ plot.see_check_normality <- function(x, .plot_diag_reqq <- function(x, size_point, size_line, + size_axis_title = base_size, + size_title = 12, panel = TRUE, alpha_level = 0.2, theme_style = theme_lucid, @@ -412,7 +444,9 @@ plot.see_check_normality <- function(x, theme_style( base_size = base_size, plot.title.space = 3, - axis.title.space = 5 + axis.title.space = 5, + plot.title.size = size_title, + axis.title.size = size_axis_title ) if (isTRUE(show_dots)) { diff --git a/R/plot.check_outliers.R b/R/plot.check_outliers.R index 6b5b721a1..c81ce2375 100644 --- a/R/plot.check_outliers.R +++ b/R/plot.check_outliers.R @@ -33,6 +33,9 @@ plot.see_check_outliers <- function(x, size_text = 3.5, size_line = 0.8, + size_title = 12, + size_axis_title = base_size, + base_size = 10, dot_alpha = 0.8, colors = c("#3aaf85", "#1b6ca8", "#cd201f"), rescale_distance = TRUE, @@ -49,6 +52,9 @@ plot.see_check_outliers <- function(x, show_labels = show_labels, size_text = size_text, size_line = size_line, + size_axis_title = size_axis_title, + size_title = size_title, + base_size = base_size, dot_alpha_level = dot_alpha, colors = colors ) diff --git a/R/plot.check_outliers_new.R b/R/plot.check_outliers_new.R index 1571f947c..74d60527a 100644 --- a/R/plot.check_outliers_new.R +++ b/R/plot.check_outliers_new.R @@ -6,6 +6,8 @@ size_line = NULL, size_point = 2, size_text = NULL, + size_axis_title = base_size, + size_title = 12, theme_style = theme_lucid, base_size = 10, colors = unname(social_colors(c("green", "blue grey", "red"))), @@ -136,7 +138,13 @@ p <- p + .cook_lines + - theme_style(base_size = base_size, plot.title.space = 3, axis.title.space = 5) + + theme_style( + base_size = base_size, + plot.title.space = 3, + axis.title.space = 5, + plot.title.size = size_title, + axis.title.size = size_axis_title + ) + guides(colour = "none", text = "none") } diff --git a/R/plot.check_overdisp.R b/R/plot.check_overdisp.R index e8b6711f2..d57b71302 100644 --- a/R/plot.check_overdisp.R +++ b/R/plot.check_overdisp.R @@ -1,6 +1,9 @@ #' @export plot.see_check_overdisp <- function(x, size_line = 0.8, + size_title = 12, + size_axis_title = base_size, + base_size = 10, colors = c("#3aaf85", "#1b6ca8"), type = 1, ...) { @@ -9,6 +12,9 @@ plot.see_check_overdisp <- function(x, style = theme_lucid, colors = colors, size_line = size_line, + size_title = size_title, + size_axis_title = size_axis_title, + base_size = base_size, type = type ) } @@ -16,6 +22,8 @@ plot.see_check_overdisp <- function(x, .plot_diag_overdispersion <- function(x, theme_style = theme_lucid, + size_axis_title = base_size, + size_title = 12, base_size = 10, colors = c("#3aaf85", "#1b6ca8"), size_line = 0.8, @@ -35,7 +43,9 @@ plot.see_check_overdisp <- function(x, theme_style( base_size = base_size, plot.title.space = 3, - axis.title.space = 5 + axis.title.space = 5, + plot.title.size = size_title, + axis.title.size = size_axis_title ) } else { p <- ggplot2::ggplot(x) + @@ -55,7 +65,9 @@ plot.see_check_overdisp <- function(x, theme_style( base_size = base_size, plot.title.space = 3, - axis.title.space = 5 + axis.title.space = 5, + plot.title.size = size_title, + axis.title.size = size_axis_title ) } diff --git a/R/plot.check_predictions.R b/R/plot.check_predictions.R index 780fe8173..d69f79dca 100644 --- a/R/plot.check_predictions.R +++ b/R/plot.check_predictions.R @@ -75,8 +75,11 @@ data_plot.performance_pp_check <- function(x, type = "density", ...) { print.see_performance_pp_check <- function(x, size_line = 0.5, size_point = 2, - line_alpha = 0.15, size_bar = 0.7, + size_axis_title = base_size, + size_title = 12, + base_size = 10, + line_alpha = 0.15, style = theme_lucid, colors = unname(social_colors(c("green", "blue"))), type = c("density", "discrete_dots", "discrete_interval", "discrete_both"), @@ -98,11 +101,14 @@ print.see_performance_pp_check <- function(x, p1 <- .plot_pp_check( x, - size_line, - size_point, - line_alpha, + size_line = size_line, + size_point = size_point, + line_alpha = line_alpha, theme_style = style, colors = colors, + base_size = base_size, + size_title = size_title, + size_axis_title = size_axis_title, type = type, x_limits = x_limits, ... @@ -124,10 +130,12 @@ print.see_performance_pp_check <- function(x, plot.see_performance_pp_check <- function(x, size_line = 0.5, size_point = 2, - line_alpha = 0.15, size_bar = 0.7, - style = theme_lucid, + size_axis_title = base_size, + size_title = 12, base_size = 10, + line_alpha = 0.15, + style = theme_lucid, colors = unname(social_colors(c("green", "blue"))), type = c("density", "discrete_dots", "discrete_interval", "discrete_both"), x_limits = NULL, @@ -148,11 +156,13 @@ plot.see_performance_pp_check <- function(x, p1 <- .plot_pp_check( x, - size_line, - size_point, - line_alpha, + size_line = size_line, + size_point = size_point, + line_alpha = line_alpha, theme_style = style, base_size = base_size, + size_axis_title = size_axis_title, + size_title = size_title, colors = colors, type = type, x_limits = x_limits, @@ -175,6 +185,8 @@ plot.see_performance_pp_check <- function(x, line_alpha, theme_style, base_size = 10, + size_axis_title = 10, + size_title = 12, colors, type = "density", x_limits = NULL, @@ -209,7 +221,9 @@ plot.see_performance_pp_check <- function(x, out <- out + theme_style( base_size = base_size, plot.title.space = 3, - axis.title.space = 5 + axis.title.space = 5, + axis.title.size = size_axis_title, + plot.title.size = size_title ) } @@ -229,7 +243,13 @@ plot.see_performance_pp_check <- function(x, } -.plot_check_predictions_density <- function(x, colors, info, size_line, line_alpha, bandwidth, ...) { +.plot_check_predictions_density <- function(x, + colors, + info, + size_line, + line_alpha, + bandwidth, + ...) { ggplot2::ggplot(x) + ggplot2::stat_density( mapping = ggplot2::aes( diff --git a/R/plot.performance_simres.R b/R/plot.performance_simres.R index 5bf7d0830..a9c5801d6 100644 --- a/R/plot.performance_simres.R +++ b/R/plot.performance_simres.R @@ -33,13 +33,15 @@ plot.see_performance_simres <- function(x, size_line = 0.8, size_point = 2, + size_title = 12, + size_axis_title = base_size, + base_size = 10, alpha = 0.2, dot_alpha = 0.8, colors = c("#3aaf85", "#1b6ca8"), detrend = FALSE, transform = NULL, style = theme_lucid, - base_size = 10, ...) { # need DHARMa to be installed insight::check_if_installed("DHARMa") @@ -147,7 +149,9 @@ plot.see_performance_simres <- function(x, style( base_size = base_size, plot.title.space = 3, - axis.title.space = 5 + axis.title.space = 5, + plot.title.size = size_title, + axis.title.size = size_axis_title ) } diff --git a/man/plot.see_check_collinearity.Rd b/man/plot.see_check_collinearity.Rd index 1de59b763..b5e79d000 100644 --- a/man/plot.see_check_collinearity.Rd +++ b/man/plot.see_check_collinearity.Rd @@ -10,6 +10,8 @@ colors = c("#3aaf85", "#1b6ca8", "#cd201f"), size_point = 3.5, size_line = 0.8, + size_title = 12, + size_axis_title = base_size, base_size = 10, ... ) @@ -27,7 +29,8 @@ hex-format) for points and line.} \item{size_line}{Numeric value specifying size of line geoms.} -\item{base_size}{Base font size for plots.} +\item{base_size, size_axis_title, size_title}{Numeric value specifying size of +axis and plot titles.} \item{...}{Arguments passed to or from other methods.} } diff --git a/man/plot.see_check_heteroscedasticity.Rd b/man/plot.see_check_heteroscedasticity.Rd index 35575d286..6fa0b472b 100644 --- a/man/plot.see_check_heteroscedasticity.Rd +++ b/man/plot.see_check_heteroscedasticity.Rd @@ -4,7 +4,16 @@ \alias{plot.see_check_heteroscedasticity} \title{Plot method for (non-)constant error variance checks} \usage{ -\method{plot}{see_check_heteroscedasticity}(x, data = NULL, size_point = 2, size_line = 0.8, base_size = 10, ...) +\method{plot}{see_check_heteroscedasticity}( + x, + data = NULL, + size_point = 2, + size_line = 0.8, + size_title = 12, + size_axis_title = base_size, + base_size = 10, + ... +) } \arguments{ \item{x}{An object.} @@ -16,7 +25,8 @@ statistical model.} \item{size_line}{Numeric value specifying size of line geoms.} -\item{base_size}{Base font size for plots.} +\item{base_size, size_axis_title, size_title}{Numeric value specifying size of +axis and plot titles.} \item{...}{Arguments passed to or from other methods.} } diff --git a/man/plot.see_check_normality.Rd b/man/plot.see_check_normality.Rd index e95dbe292..6f6447c7d 100644 --- a/man/plot.see_check_normality.Rd +++ b/man/plot.see_check_normality.Rd @@ -10,9 +10,11 @@ data = NULL, size_line = 0.8, size_point = 2, + size_title = 12, + size_axis_title = base_size, + base_size = 10, alpha = 0.2, dot_alpha = 0.8, - base_size = 10, colors = c("#3aaf85", "#1b6ca8"), detrend = TRUE, method = "ell", @@ -34,12 +36,13 @@ statistical model.} \item{size_point}{Numeric specifying size of point-geoms.} +\item{base_size, size_axis_title, size_title}{Numeric value specifying size of +axis and plot titles.} + \item{alpha}{Numeric value specifying alpha level of the confidence bands.} \item{dot_alpha}{Numeric value specifying alpha level of the point geoms.} -\item{base_size}{Base font size for plots.} - \item{colors}{Character vector of length two, indicating the colors (in hex-format) for points and line.} diff --git a/man/plot.see_check_outliers.Rd b/man/plot.see_check_outliers.Rd index ed17cce12..1b839ff3f 100644 --- a/man/plot.see_check_outliers.Rd +++ b/man/plot.see_check_outliers.Rd @@ -8,6 +8,9 @@ x, size_text = 3.5, size_line = 0.8, + size_title = 12, + size_axis_title = base_size, + base_size = 10, dot_alpha = 0.8, colors = c("#3aaf85", "#1b6ca8", "#cd201f"), rescale_distance = TRUE, @@ -23,6 +26,9 @@ \item{size_line}{Numeric value specifying size of line geoms.} +\item{base_size, size_axis_title, size_title}{Numeric value specifying size of +axis and plot titles.} + \item{dot_alpha}{Numeric value specifying alpha level of the point geoms.} \item{colors}{Character vector of length two, indicating the colors (in diff --git a/man/plot.see_performance_simres.Rd b/man/plot.see_performance_simres.Rd index 3028a6c58..8457c3a5d 100644 --- a/man/plot.see_performance_simres.Rd +++ b/man/plot.see_performance_simres.Rd @@ -8,13 +8,15 @@ x, size_line = 0.8, size_point = 2, + size_title = 12, + size_axis_title = base_size, + base_size = 10, alpha = 0.2, dot_alpha = 0.8, colors = c("#3aaf85", "#1b6ca8"), detrend = FALSE, transform = NULL, style = theme_lucid, - base_size = 10, ... ) } @@ -25,6 +27,9 @@ \item{size_point}{Numeric specifying size of point-geoms.} +\item{base_size, size_axis_title, size_title}{Numeric value specifying size of +axis and plot titles.} + \item{alpha}{Numeric value specifying alpha level of the confidence bands.} \item{dot_alpha}{Numeric value specifying alpha level of the point geoms.} @@ -41,8 +46,6 @@ See argument \code{quantileFuntion} in \code{?DHARMa:::residuals.DHARMa} for mor \item{style}{A ggplot2-theme.} -\item{base_size}{Base font size for plots.} - \item{...}{Arguments passed to or from other methods.} } \value{ diff --git a/man/print.see_performance_pp_check.Rd b/man/print.see_performance_pp_check.Rd index 145105781..7e3d88349 100644 --- a/man/print.see_performance_pp_check.Rd +++ b/man/print.see_performance_pp_check.Rd @@ -9,8 +9,11 @@ x, size_line = 0.5, size_point = 2, - line_alpha = 0.15, size_bar = 0.7, + size_axis_title = base_size, + size_title = 12, + base_size = 10, + line_alpha = 0.15, style = theme_lucid, colors = unname(social_colors(c("green", "blue"))), type = c("density", "discrete_dots", "discrete_interval", "discrete_both"), @@ -22,10 +25,12 @@ x, size_line = 0.5, size_point = 2, - line_alpha = 0.15, size_bar = 0.7, - style = theme_lucid, + size_axis_title = base_size, + size_title = 12, base_size = 10, + line_alpha = 0.15, + style = theme_lucid, colors = unname(social_colors(c("green", "blue"))), type = c("density", "discrete_dots", "discrete_interval", "discrete_both"), x_limits = NULL, @@ -39,10 +44,13 @@ \item{size_point}{Numeric specifying size of point-geoms.} -\item{line_alpha}{Numeric value specifying alpha of lines indicating \code{yrep}.} - \item{size_bar}{Size of bar geoms.} +\item{base_size, size_axis_title, size_title}{Numeric value specifying size of +axis and plot titles.} + +\item{line_alpha}{Numeric value specifying alpha of lines indicating \code{yrep}.} + \item{style}{A ggplot2-theme.} \item{colors}{Character vector of length two, indicating the colors (in @@ -57,8 +65,6 @@ or ordinal etc. - outcomes).} If not \code{NULL}, will zoom in the x-axis to the specified limits.} \item{...}{Arguments passed to or from other methods.} - -\item{base_size}{Base font size for plots.} } \value{ A ggplot2-object. diff --git a/tests/testthat/_snaps/check_model/check-model-works-for-lm.svg b/tests/testthat/_snaps/check_model/check-model-works-for-lm.svg index a6b0b1114..6f8acb9f9 100644 --- a/tests/testthat/_snaps/check_model/check-model-works-for-lm.svg +++ b/tests/testthat/_snaps/check_model/check-model-works-for-lm.svg @@ -21,82 +21,82 @@ - - + + - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + - --2 --1 -0 -1 -2 - --2 --1 -0 -1 -2 -Standard Normal Distribution Quantiles -Sample Quantile Deviations + +-2 +-1 +0 +1 +2 + +-2 +-1 +0 +1 +2 +Standard Normal Distribution Quantiles +Sample Quantile Deviations Dots should fall along the line Normality of Residuals diff --git a/tests/vdiffr.Rout.fail b/tests/vdiffr.Rout.fail new file mode 100644 index 000000000..406c78ae1 --- /dev/null +++ b/tests/vdiffr.Rout.fail @@ -0,0 +1,370 @@ +Environment: +- vdiffr-svg-engine: 2.0 +- vdiffr: 1.0.7 + + +Failed doppelganger: check-model-works-for-lm (C:\Users\mail\Documents\R\easystats\see\tests\testthat\_snaps/check_model/check-model-works-for-lm.svg) + +< before +> after +@@ 22,80 / 22,80 @@ + + +< +> +< +> + + +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> +< +> + + +< +> +< -2 +> -2 +< -1 +> -1 +< 0 +> 0 +< 1 +> 1 +< 2 +> 2 +< +> +< -2 +> -2 +< -1 +> -1 +< 0 +> 0 +< 1 +> 1 +< 2 +> 2 +< Standard Normal Distribution Quantiles +> Standard Normal Distribution Quantiles +< Sample Quantile Deviations +> Sample Quantile Deviations + Dots should fall along the lin + e + Normality of Residuals +