Skip to content

Commit

Permalink
Remove stray triple colons
Browse files Browse the repository at this point in the history
  • Loading branch information
EeethB committed Jul 11, 2024
1 parent 786bb10 commit 057d92c
Show file tree
Hide file tree
Showing 7 changed files with 9 additions and 60 deletions.
2 changes: 1 addition & 1 deletion R/adjust_weights.R
Original file line number Diff line number Diff line change
Expand Up @@ -131,7 +131,7 @@ adjust_weights_parametric <- function(matrix_weights,
#' matrix_intersections <- weighting_strategy[, seq_len(num_hyps)]
#' matrix_weights <- weighting_strategy[, -seq_len(num_hyps)]
#'
#' graphicalMCP:::adjust_weights_simes(
#' adjust_weights_simes(
#' matrix_weights = matrix_weights,
#' p = p,
#' test_groups = list(1:4)
Expand Down
13 changes: 0 additions & 13 deletions R/test_values.R
Original file line number Diff line number Diff line change
Expand Up @@ -38,19 +38,6 @@
#' for weighted parametric multiple test procedures.
#' \emph{Biometrical Journal}, 59(5), 918-931.
#'
#' @examples
#' alpha <- 0.025
#' hypotheses <- c(H1 = 0.5, H2 = 0.5, H3 = 0, H4 = 0)
#' p <- c(0.018, 0.01, 0.105, 0.006)
#'
#' graphicalMCP:::test_values_bonferroni(p, hypotheses, alpha)
#' graphicalMCP:::test_values_parametric(
#' p,
#' hypotheses,
#' alpha,
#' test_corr = diag(4)
#' )
#' graphicalMCP:::test_values_simes(p, hypotheses, alpha)
test_values_bonferroni <- function(p, hypotheses, alpha, intersection = NA) {
if (length(p) == 0) {
NULL
Expand Down
2 changes: 1 addition & 1 deletion man/adjust_weights.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

24 changes: 0 additions & 24 deletions man/graph_test_fast.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

14 changes: 0 additions & 14 deletions man/test_values.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

6 changes: 3 additions & 3 deletions misc/testing-basics.Rmd
Original file line number Diff line number Diff line change
Expand Up @@ -180,12 +180,12 @@ inter_h <- gw[, seq_len(m)]
gw_bonf <- ifelse(inter_h, gw[, seq_len(m) + m], NA)
gw_para <-
graphicalMCP:::adjust_weights_parametric(gw_bonf, diag(m), .05, list(1:m))
adjust_weights_parametric(gw_bonf, diag(m), .05, list(1:m))
p <- runif(m, .0001, .03)
sim_corr <- diag(m)
gw_simes <- graphicalMCP:::adjust_weights_simes(gw_bonf, p, list(1:m))
gw_simes <- adjust_weights_simes(gw_bonf, p, list(1:m))
groups <- list(1:floor(m / 2), (floor(m / 2) + 1):m)
h <- as.integer(rep(0, m))
Expand Down Expand Up @@ -219,7 +219,7 @@ simes_bench <- bench::mark(
graphicalMCP:::graph_test_closure_fast(
p,
.05,
graphicalMCP:::adjust_weights_simes(gw_bonf, p, list(1:m)),
adjust_weights_simes(gw_bonf, p, list(1:m)),
inter_h
),
`gMCP::gMCP` =
Expand Down
8 changes: 4 additions & 4 deletions tests/testthat/test-power_tests.R
Original file line number Diff line number Diff line change
Expand Up @@ -10,13 +10,13 @@ test_that("vectorized testing matches standard testing (single-group)", {

groups1 <- list(seq_len(m))

gw_compact_simes <- graphicalMCP:::adjust_weights_simes(
gw_compact_simes <- adjust_weights_simes(
gw_weights,
p,
groups1
)

gw_compact_parametric <- graphicalMCP:::adjust_weights_parametric(
gw_compact_parametric <- adjust_weights_parametric(
gw_weights,
gw_h,
diag(m),
Expand Down Expand Up @@ -73,13 +73,13 @@ test_that("vectorized testing matches standard testing (multi-group)", {
simes_groups_reduce <- list(1:2)
para_groups <- list(5:m)

adjusted_weights_simes <- graphicalMCP:::adjust_weights_simes(
adjusted_weights_simes <- adjust_weights_simes(
gw_weights[, unlist(simes_groups)],
p[unlist(simes_groups)],
simes_groups_reduce
)

adjusted_weights_para <- graphicalMCP:::adjust_weights_parametric(
adjusted_weights_para <- adjust_weights_parametric(
gw_weights,
gw_h,
diag(m),
Expand Down

0 comments on commit 057d92c

Please sign in to comment.