Skip to content

Commit

Permalink
remove long running examples
Browse files Browse the repository at this point in the history
  • Loading branch information
malcolmbarrett committed May 23, 2020
1 parent d7b40f4 commit cccfa61
Show file tree
Hide file tree
Showing 4 changed files with 0 additions and 29 deletions.
7 changes: 0 additions & 7 deletions R/permutation.R
Original file line number Diff line number Diff line change
Expand Up @@ -34,13 +34,6 @@ permute_df <- function(.data) {
#' @return a tibble with summaries on observed and permuted data (the means of
#' the permuted summaries), as well as list-cols containing them
#' @export
#'
#' @examples
#' set.seed(123)
#' df <- simulate_block_data(c(3, 4, 5), lower_corr = .4, upper_corr = .6, n = 100)
#'
#' test_permutation(df, partitioner = part_pc1(), nperm = 2)
#'
test_permutation <- function(.data, information = seq(.1, .6, by = .1), partitioner = part_icc(), ..., nperm = 100) {
observed_summary <- map_partition(.data, partitioner = partitioner, information = information, ...)
permutation_summary <- map_permutations(.data, partitioner = partitioner, information = information, ..., nperm = nperm)
Expand Down
7 changes: 0 additions & 7 deletions R/plot.R
Original file line number Diff line number Diff line change
Expand Up @@ -303,13 +303,6 @@ plot_info_hist <- function(.partition, fill = "#0172B1", color = NA,
#' @return a ggplot
#' @export
#'
#' @examples
#' set.seed(123)
#' df <- simulate_block_data(c(3, 4, 5), lower_corr = .4, upper_corr = .6, n = 100)
#'
#' test_permutation(df, partitioner = part_pc1(), nperm = 2) %>%
#' plot_permutation("nclusters")
#'
#' @importFrom rlang !!
#' @importFrom ggplot2 geom_density
plot_permutation <- function(permutations,
Expand Down
8 changes: 0 additions & 8 deletions man/plot_permutation.Rd

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

7 changes: 0 additions & 7 deletions man/test_permutation.Rd

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

0 comments on commit cccfa61

Please sign in to comment.