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

Commit

Permalink
cran submission 1.1.0
Browse files Browse the repository at this point in the history
  • Loading branch information
IndrajeetPatil committed Jun 19, 2020
1 parent b3da19b commit 60510fa
Show file tree
Hide file tree
Showing 32 changed files with 476 additions and 497 deletions.
4 changes: 2 additions & 2 deletions CRAN-RELEASE
Original file line number Diff line number Diff line change
@@ -1,2 +1,2 @@
This package was submitted to CRAN on 2020-05-29.
Once it is accepted, delete this file and tag the release (commit 5f04f77c22).
This package was submitted to CRAN on 2020-06-19.
Once it is accepted, delete this file and tag the release (commit b3da19b01d).
9 changes: 3 additions & 6 deletions DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -28,23 +28,20 @@ Imports:
dplyr,
dunn.test,
forcats,
ipmisc (>= 3.0.0.9000),
ipmisc (>= 3.0.1),
PMCMRplus,
purrr,
rlang,
stats,
tidyBF (>= 0.2.0.9000),
tidyBF (>= 0.2.1),
tidyr,
utils,
WRS2
WRS2 (>= 1.1-0)
Suggests:
knitr,
rmarkdown,
spelling,
testthat
Remotes:
IndrajeetPatil/ipmisc,
IndrajeetPatil/tidyBF
Encoding: UTF-8
Language: en-US
LazyData: true
Expand Down
2 changes: 1 addition & 1 deletion NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -6,6 +6,7 @@ export("%<>%")
export("%>%")
export("%|%")
export("%||%")
export(":=")
export(as_tibble)
export(enframe)
export(long_to_wide_converter)
Expand All @@ -21,7 +22,6 @@ importFrom(WRS2,lincon)
importFrom(WRS2,rmmcp)
importFrom(broomExtra,easystats_to_tidy_names)
importFrom(broomExtra,tidy)
importFrom(dplyr,arrange)
importFrom(dplyr,bind_cols)
importFrom(dplyr,everything)
importFrom(dplyr,full_join)
Expand Down
2 changes: 2 additions & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
Expand Up @@ -3,6 +3,8 @@
- For repeated measures datasets with `NA`s present, the Bayes Factor values
were incorrect. This is fixed.

- Internal refactoring to improve data wrangling using `ipmisc`.

# pairwiseComparisons 1.0.0

- Removes dependence on `jmv` and instead relies on `dunn.test` and
Expand Down
21 changes: 1 addition & 20 deletions R/helpers.R
Original file line number Diff line number Diff line change
Expand Up @@ -26,23 +26,4 @@ p_adjust_column_adder <- function(df, p.adjust.method) {
df %>%
dplyr::mutate(p.value = stats::p.adjust(p = p.value, method = p.adjust.method)) %>%
signif_column(data = ., p = p.value)
}


#' @name df_cleanup_paired
#'
#' @importFrom rlang :=
#' @importFrom dplyr rename select arrange mutate
#' @importFrom tidyr gather
#'
#' @noRd
#' @keywords internal

df_cleanup_paired <- function(data, x, y) {
data %>%
long_to_wide_converter(data = ., x = {{ x }}, y = {{ y }}) %>%
tidyr::gather(data = ., key, value, -rowid) %>%
dplyr::arrange(.data = ., rowid) %>%
dplyr::rename(.data = ., {{ x }} := key, {{ y }} := value) %>%
dplyr::mutate(.data = ., {{ x }} := factor({{ x }}))
}
}
5 changes: 3 additions & 2 deletions R/pairwise_comparisons.R
Original file line number Diff line number Diff line change
Expand Up @@ -369,6 +369,9 @@ pairwise_comparisons <- function(data,
# ---------------------------- robust ----------------------------------

if (type == "robust") {
# data cleanup
df_internal %<>% long_to_wide_converter(., {{ x }}, {{ y }}, paired, FALSE)

if (isFALSE(paired)) {
# object with all details about pairwise comparisons
rob_pairwise_df <-
Expand All @@ -382,8 +385,6 @@ pairwise_comparisons <- function(data,
# converting to long format and then getting it back in wide so that the
# rowid variable can be used as the block variable
if (isTRUE(paired)) {
df_internal %<>% df_cleanup_paired(data = ., x = {{ x }}, y = {{ y }})

# running pairwise multiple comparison tests
rob_pairwise_df <-
WRS2::rmmcp(
Expand Down
4 changes: 4 additions & 0 deletions R/reexports.R
Original file line number Diff line number Diff line change
Expand Up @@ -25,6 +25,10 @@ rlang::`%||%`
#' @importFrom rlang "%|%"
rlang::`%|%`

#' @export
#' @importFrom rlang ":="
rlang::`:=`

#' @export
#' @importFrom ipmisc tibble
ipmisc::tibble
Expand Down
11 changes: 6 additions & 5 deletions codemeta.json
Original file line number Diff line number Diff line change
Expand Up @@ -159,14 +159,14 @@
"@type": "SoftwareApplication",
"identifier": "ipmisc",
"name": "ipmisc",
"version": ">= 3.0.0.9000",
"version": ">= 3.0.1",
"provider": {
"@id": "https://cran.r-project.org",
"@type": "Organization",
"name": "Comprehensive R Archive Network (CRAN)",
"url": "https://cran.r-project.org"
},
"sameAs": "https://github.com/IndrajeetPatil/ipmisc"
"sameAs": "https://CRAN.R-project.org/package=ipmisc"
},
{
"@type": "SoftwareApplication",
Expand Down Expand Up @@ -213,14 +213,14 @@
"@type": "SoftwareApplication",
"identifier": "tidyBF",
"name": "tidyBF",
"version": ">= 0.2.0.9000",
"version": ">= 0.2.1",
"provider": {
"@id": "https://cran.r-project.org",
"@type": "Organization",
"name": "Comprehensive R Archive Network (CRAN)",
"url": "https://cran.r-project.org"
},
"sameAs": "https://github.com/IndrajeetPatil/tidyBF"
"sameAs": "https://CRAN.R-project.org/package=tidyBF"
},
{
"@type": "SoftwareApplication",
Expand All @@ -243,6 +243,7 @@
"@type": "SoftwareApplication",
"identifier": "WRS2",
"name": "WRS2",
"version": ">= 1.1-0",
"provider": {
"@id": "https://cran.r-project.org",
"@type": "Organization",
Expand Down Expand Up @@ -277,5 +278,5 @@
"name": "Comprehensive R Archive Network (CRAN)",
"url": "https://cran.r-project.org"
},
"fileSize": "1480.258KB"
"fileSize": "1485.799KB"
}
6 changes: 5 additions & 1 deletion cran-comments.md
Original file line number Diff line number Diff line change
Expand Up @@ -5,4 +5,8 @@

## R CMD check results

0 errors | 0 warnings | 0 note
0 errors | 0 warnings | 0 note

- Gets rid of `NOTE` produced in daily CRAN checks.

- Makes package compatible with new release of `ipmisc` and `tidyBF`.
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.

Loading

2 comments on commit 60510fa

@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:29: warning: Avoid 1:NCOL(...) expressions, use seq_len.

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

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

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

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

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

R/pairwise_comparisons.R:482: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:29: warning: Avoid 1:NCOL(...) expressions, use seq_len.

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

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

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

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

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

R/pairwise_comparisons.R:482: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.