diff --git a/R/engines.R b/R/engines.R index 270386c98..60f482a7c 100644 --- a/R/engines.R +++ b/R/engines.R @@ -41,7 +41,7 @@ load_libs <- function(x, quiet, attach = FALSE) { if (!attach) { suppressPackageStartupMessages(requireNamespace(pkg, quietly = quiet)) } else { - library(pkg, character.only = TRUE) + library(pkg, character.only = TRUE, quietly = quiet) } } invisible(x) diff --git a/tests/testthat/test_grouped_glm.R b/tests/testthat/test_grouped_glm.R index 9731fca47..3b92fb7dc 100644 --- a/tests/testthat/test_grouped_glm.R +++ b/tests/testthat/test_grouped_glm.R @@ -1,10 +1,8 @@ -library(tidyr) - test_that('correct results for glm_grouped()', { ucb_weighted <- as.data.frame(UCBAdmissions) ucb_weighted$Freq <- as.integer(ucb_weighted$Freq) - ucb_long <- uncount(ucb_weighted, Freq) + ucb_long <- tidyr::uncount(ucb_weighted, Freq) ungrouped <- glm(Admit ~ Gender + Dept, data = ucb_long, family = binomial) @@ -12,6 +10,6 @@ test_that('correct results for glm_grouped()', { grouped <- glm_grouped(Admit ~ Gender + Dept, data = ucb_weighted, weights = ucb_weighted$Freq), regexp = NA ) - expect_equal(grouped$df.null, 11) + expect_equal(grouped$df.null, 11) })