From 0263271df253db0a7699005267e425c0bb72c374 Mon Sep 17 00:00:00 2001 From: Mauricio Vargas Sepulveda Date: Tue, 26 Aug 2025 18:54:55 -0400 Subject: [PATCH 1/4] correct access to dplyr/ggplot2 namespace --- R/scan_data.R | 4 ++-- 1 file changed, 2 insertions(+), 2 deletions(-) diff --git a/R/scan_data.R b/R/scan_data.R index 2d3490099..b92b4adc1 100644 --- a/R/scan_data.R +++ b/R/scan_data.R @@ -1315,8 +1315,8 @@ probe_interactions <- function(data) { ggforce::geom_autodensity() + ggplot2::geom_density2d() + ggforce::facet_matrix( - rows = ggplot2::vars(gt::everything()), layer.diag = 2, layer.upper = 3, - grid.y.diag = FALSE) + + rows = ggplot2::vars(dplyr::everything()), layer.diag = 2, layer.upper = 3, + grid.y.diag = FALSE, labeller = ggplot2::label_value) + ggplot2::theme_minimal() + ggplot2::theme( axis.text.x = ggplot2::element_text( From 9d0f04cb8531f9902443e3604f8f89105ba7b748 Mon Sep 17 00:00:00 2001 From: Mauricio Vargas Sepulveda Date: Wed, 27 Aug 2025 10:22:02 -0400 Subject: [PATCH 2/4] lint --- R/scan_data.R | 4 ++-- 1 file changed, 2 insertions(+), 2 deletions(-) diff --git a/R/scan_data.R b/R/scan_data.R index b92b4adc1..02c30f581 100644 --- a/R/scan_data.R +++ b/R/scan_data.R @@ -1315,8 +1315,8 @@ probe_interactions <- function(data) { ggforce::geom_autodensity() + ggplot2::geom_density2d() + ggforce::facet_matrix( - rows = ggplot2::vars(dplyr::everything()), layer.diag = 2, layer.upper = 3, - grid.y.diag = FALSE, labeller = ggplot2::label_value) + + rows = ggplot2::vars(dplyr::everything()), layer.diag = 2, + layer.upper = 3, grid.y.diag = FALSE, labeller = ggplot2::label_value) + ggplot2::theme_minimal() + ggplot2::theme( axis.text.x = ggplot2::element_text( From 120010b6da5fdda917a7bc68bd181fd0a3f1a3c6 Mon Sep 17 00:00:00 2001 From: Mauricio Vargas Sepulveda Date: Wed, 27 Aug 2025 10:49:38 -0400 Subject: [PATCH 3/4] fix #637 --- R/get_sundered_data.R | 60 +++++++++++++++++++++++++++++++------------ R/utils.R | 26 +++++++++++++++++++ 2 files changed, 69 insertions(+), 17 deletions(-) diff --git a/R/get_sundered_data.R b/R/get_sundered_data.R index 57cfe9ff2..6b20072c0 100644 --- a/R/get_sundered_data.R +++ b/R/get_sundered_data.R @@ -434,20 +434,34 @@ get_sundered_data <- function( if (!is.null(type) && type == "pass") { - sundered_tbl_pass <- - tbl_check_join %>% - dplyr::filter(pb_is_good_ == 1) %>% - dplyr::select(-pb_is_good_) + if (uses_numeric_logical(input_tbl)) { + sundered_tbl_pass <- + tbl_check_join %>% + dplyr::filter(pb_is_good_ == 1) %>% + dplyr::select(-pb_is_good_) + } else { + sundered_tbl_pass <- + tbl_check_join %>% + dplyr::filter(pb_is_good_ == TRUE) %>% + dplyr::select(-pb_is_good_) + } return(sundered_tbl_pass) } if (!is.null(type) && type == "fail") { - sundered_tbl_fail <- - tbl_check_join %>% - dplyr::filter(pb_is_good_ == 0) %>% - dplyr::select(-pb_is_good_) + if (uses_numeric_logical(input_tbl)) { + sundered_tbl_fail <- + tbl_check_join %>% + dplyr::filter(pb_is_good_ == 0) %>% + dplyr::select(-pb_is_good_) + } else { + sundered_tbl_fail <- + tbl_check_join %>% + dplyr::filter(pb_is_good_ == FALSE) %>% + dplyr::select(-pb_is_good_) + } return(sundered_tbl_fail) } @@ -468,15 +482,27 @@ get_sundered_data <- function( if (is.null(type)) { - sundered_tbl_list <- - list( - pass = tbl_check_join %>% - dplyr::filter(pb_is_good_ == 1) %>% - dplyr::select(-pb_is_good_), - fail = tbl_check_join %>% - dplyr::filter(pb_is_good_ == 0) %>% - dplyr::select(-pb_is_good_) - ) + if (uses_numeric_logical(input_tbl)) { + sundered_tbl_list <- + list( + pass = tbl_check_join %>% + dplyr::filter(pb_is_good_ == 1) %>% + dplyr::select(-pb_is_good_), + fail = tbl_check_join %>% + dplyr::filter(pb_is_good_ == 0) %>% + dplyr::select(-pb_is_good_) + ) + } else { + sundered_tbl_list <- + list( + pass = tbl_check_join %>% + dplyr::filter(pb_is_good_ == TRUE) %>% + dplyr::select(-pb_is_good_), + fail = tbl_check_join %>% + dplyr::filter(pb_is_good_ == FALSE) %>% + dplyr::select(-pb_is_good_) + ) + } return(sundered_tbl_list) } diff --git a/R/utils.R b/R/utils.R index 21bf55a08..b49d33a4d 100644 --- a/R/utils.R +++ b/R/utils.R @@ -88,6 +88,32 @@ is_tbl_mssql <- function(x) { grepl("sql server|sqlserver", tbl_src_details) } +is_tbl_duckdb <- function(x) { + + if (!is_tbl_dbi(x)) { + return(FALSE) + } + + tbl_src_details <- tolower(get_tbl_dbi_src_details(x)) + grepl("duckdb", tbl_src_details) +} + +is_tbl_sqlite <- function(x) { + + if (!is_tbl_dbi(x)) { + return(FALSE) + } + + tbl_src_details <- tolower(get_tbl_dbi_src_details(x)) + grepl("sqlite", tbl_src_details) +} + +# Check if table type requires numeric logical values (1/0) instead of +# TRUE/FALSE +uses_numeric_logical <- function(x) { + is_tbl_mssql(x) || is_tbl_duckdb(x) || is_tbl_sqlite(x) +} + # nocov end # Generate a label for the `agent` or `informant` object From 6039e6448f78c03993400d5792d266a4fa74be12 Mon Sep 17 00:00:00 2001 From: Mauricio Vargas Sepulveda Date: Wed, 27 Aug 2025 11:53:32 -0400 Subject: [PATCH 4/4] small lint correction --- R/utils.R | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/R/utils.R b/R/utils.R index b49d33a4d..39b34307c 100644 --- a/R/utils.R +++ b/R/utils.R @@ -109,7 +109,7 @@ is_tbl_sqlite <- function(x) { } # Check if table type requires numeric logical values (1/0) instead of -# TRUE/FALSE +# logicals uses_numeric_logical <- function(x) { is_tbl_mssql(x) || is_tbl_duckdb(x) || is_tbl_sqlite(x) }