Skip to content
This repository has been archived by the owner on Mar 24, 2022. It is now read-only.

Commit

Permalink
bump to devel
Browse files Browse the repository at this point in the history
  • Loading branch information
IndrajeetPatil committed Sep 4, 2020
1 parent 2d7769a commit 8049c44
Show file tree
Hide file tree
Showing 25 changed files with 232 additions and 233 deletions.
2 changes: 1 addition & 1 deletion DESCRIPTION
@@ -1,7 +1,7 @@
Type: Package
Package: pairwiseComparisons
Title: Multiple Pairwise Comparison Tests
Version: 2.0.0
Version: 2.0.0.9000
Authors@R:
person(given = "Indrajeet",
family = "Patil",
Expand Down
2 changes: 2 additions & 0 deletions NEWS.md
@@ -1,3 +1,5 @@
# pairwiseComparisons 2.0.0.9000

# pairwiseComparisons 2.0.0

- Fixes a bug which affected results for within-subjects design when the
Expand Down
28 changes: 7 additions & 21 deletions R/pairwise_comparisons.R
Expand Up @@ -69,6 +69,9 @@
#' set.seed(123)
#' library(pairwiseComparisons)
#'
#' # show me all columns and make the column titles bold
#' options(tibble.width = Inf, pillar.bold = TRUE)
#'
#' #------------------- between-subjects design ----------------------------
#'
#' # parametric
Expand Down Expand Up @@ -217,42 +220,25 @@ pairwise_comparisons <- function(data,
.data = .,
{{ x }} := forcats::fct_relabel(
.f = {{ x }},
.fun = ~ gsub(
x = .x,
pattern = "-",
replacement = "_"
)
.fun = ~ gsub(x = .x, pattern = "-", replacement = "_")
)
)

# extracting and cleaning up Tukey's HSD output
df_tukey <-
stats::TukeyHSD(x = aovmodel, conf.level = 0.95) %>%
broomExtra::tidy(.)

# breaking change in `broom 0.7.0`
if ("contrast" %in% names(df_tukey)) {
df_tukey %<>% dplyr::rename(.data = ., comparison = contrast)
}

# cleanup
df_tukey %<>%
dplyr::select(.data = ., comparison, estimate) %>%
broomExtra::tidy(.) %>%
dplyr::select(.data = ., comparison = contrast, mean.difference = estimate) %>%
tidyr::separate(
data = .,
col = comparison,
into = c("group1", "group2"),
sep = "-"
) %>%
dplyr::rename(.data = ., mean.difference = estimate) %>%
dplyr::mutate_at(
.tbl = .,
.vars = dplyr::vars(dplyr::matches("^group[0-9]$")),
.funs = ~ gsub(
x = .,
pattern = "_",
replacement = "-"
)
.funs = ~ gsub(x = ., pattern = "_", replacement = "-")
)

# tidy dataframe with results from pairwise tests
Expand Down
4 changes: 2 additions & 2 deletions codemeta.json
Expand Up @@ -14,7 +14,7 @@
],
"issueTracker": "\n https://github.com/IndrajeetPatil/pairwiseComparisons/issues",
"license": "https://spdx.org/licenses/GPL-3.0",
"version": "2.0.0",
"version": "2.0.0.9000",
"programmingLanguage": {
"@type": "ComputerLanguage",
"name": "R",
Expand Down Expand Up @@ -278,5 +278,5 @@
"name": "Comprehensive R Archive Network (CRAN)",
"url": "https://cran.r-project.org"
},
"fileSize": "1320.873KB"
"fileSize": "1321.401KB"
}
2 changes: 1 addition & 1 deletion docs/404.html

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

2 changes: 1 addition & 1 deletion docs/CODE_OF_CONDUCT.html

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

2 changes: 1 addition & 1 deletion docs/CONTRIBUTING.html

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

2 changes: 1 addition & 1 deletion docs/LICENSE-text.html

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

2 changes: 1 addition & 1 deletion docs/LICENSE.html

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

2 changes: 1 addition & 1 deletion docs/SUPPORT.html

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

2 changes: 1 addition & 1 deletion docs/authors.html

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

2 changes: 1 addition & 1 deletion docs/index.html

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

9 changes: 7 additions & 2 deletions docs/news/index.html

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

2 changes: 1 addition & 1 deletion docs/pkgdown.yml
Expand Up @@ -2,7 +2,7 @@ pandoc: 2.10.1
pkgdown: 1.5.1.9000
pkgdown_sha: c6b35532515a7ae433eff4b547d77eeae4278664
articles: []
last_built: 2020-09-04T11:36Z
last_built: 2020-09-04T19:50Z
urls:
reference: https://indrajeetpatil.github.io/pairwiseComparisons//reference
article: https://indrajeetpatil.github.io/pairwiseComparisons//articles
Expand Down
30 changes: 15 additions & 15 deletions docs/reference/bugs_long.html

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

2 changes: 1 addition & 1 deletion docs/reference/games_howell.html

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

2 changes: 1 addition & 1 deletion docs/reference/index.html

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

3 comments on commit 8049c44

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

R/games_howell.R:53:28: warning: Avoid 1:NCOL(...) expressions, use seq_len.

statistics <- lapply(X = 1:NCOL(combs), FUN = function(x) {
                           ^

R/games_howell.R:86:13: warning: Avoid 1:NCOL(...) expressions, use seq_len.

X = 1:NCOL(combs),
            ^

R/games_howell.R:93:13: warning: Avoid 1:NCOL(...) expressions, use seq_len.

X = 1:NCOL(combs),
            ^

R/games_howell.R:102:5: warning: local variable ‘stats’ assigned but may not be used

stats <- list(group1, group2, mean.diff, se, t, df, p, conf.high[[1]], conf.low[[1]])
    ^~~~~

R/pairwise_comparisons.R:455:3: warning: local variable ‘adjust_text’ assigned but may not be used

adjust_text <- ifelse(p.adjust.method == "none", "unadjusted", "adjusted")
  ^~~~~~~~~~~

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

R/games_howell.R:53:28: warning: Avoid 1:NCOL(...) expressions, use seq_len.

statistics <- lapply(X = 1:NCOL(combs), FUN = function(x) {
                           ^

R/games_howell.R:86:13: warning: Avoid 1:NCOL(...) expressions, use seq_len.

X = 1:NCOL(combs),
            ^

R/games_howell.R:93:13: warning: Avoid 1:NCOL(...) expressions, use seq_len.

X = 1:NCOL(combs),
            ^

R/games_howell.R:102:5: warning: local variable ‘stats’ assigned but may not be used

stats <- list(group1, group2, mean.diff, se, t, df, p, conf.high[[1]], conf.low[[1]])
    ^~~~~

R/pairwise_comparisons.R:455:3: warning: local variable ‘adjust_text’ assigned but may not be used

adjust_text <- ifelse(p.adjust.method == "none", "unadjusted", "adjusted")
  ^~~~~~~~~~~

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

R/games_howell.R:53:28: warning: Avoid 1:NCOL(...) expressions, use seq_len.

statistics <- lapply(X = 1:NCOL(combs), FUN = function(x) {
                           ^

R/games_howell.R:86:13: warning: Avoid 1:NCOL(...) expressions, use seq_len.

X = 1:NCOL(combs),
            ^

R/games_howell.R:93:13: warning: Avoid 1:NCOL(...) expressions, use seq_len.

X = 1:NCOL(combs),
            ^

R/games_howell.R:102:5: warning: local variable ‘stats’ assigned but may not be used

stats <- list(group1, group2, mean.diff, se, t, df, p, conf.high[[1]], conf.low[[1]])
    ^~~~~

R/pairwise_comparisons.R:455:3: warning: local variable ‘adjust_text’ assigned but may not be used

adjust_text <- ifelse(p.adjust.method == "none", "unadjusted", "adjusted")
  ^~~~~~~~~~~

Please sign in to comment.