CRAN Package Check Results for Package widyr

Last updated on 2022-09-11 12:56:32 CEST.

Flavor Version Tinstall Tcheck Ttotal Status Flags
r-devel-linux-x86_64-debian-clang 0.1.4 10.60 128.88 139.48 ERROR
r-devel-linux-x86_64-debian-gcc 0.1.4 6.54 94.31 100.85 ERROR
r-devel-linux-x86_64-fedora-clang 0.1.4 183.64 ERROR
r-devel-linux-x86_64-fedora-gcc 0.1.4 169.28 ERROR
r-devel-windows-x86_64 0.1.4 18.00 186.00 204.00 ERROR
r-patched-linux-x86_64 0.1.4 10.23 118.96 129.19 ERROR
r-release-linux-x86_64 0.1.4 7.08 120.01 127.09 ERROR
r-release-macos-arm64 0.1.4 56.00 NOTE
r-release-macos-x86_64 0.1.4 93.00 NOTE
r-release-windows-x86_64 0.1.4 18.00 188.00 206.00 ERROR
r-oldrel-macos-arm64 0.1.4 70.00 NOTE
r-oldrel-macos-x86_64 0.1.4 75.00 NOTE
r-oldrel-windows-ix86+x86_64 0.1.4 24.00 167.00 191.00 ERROR

Check Details

Version: 0.1.4
Check: examples
Result: ERROR
    Running examples in 'widyr-Ex.R' failed
    The error most likely occurred in:
    
    > base::assign(".ptime", proc.time(), pos = "CheckExEnv")
    > ### Name: pairwise_count
    > ### Title: Count pairs of items within a group
    > ### Aliases: pairwise_count pairwise_count_
    >
    > ### ** Examples
    >
    >
    > library(dplyr)
    
    Attaching package: 'dplyr'
    
    The following objects are masked from 'package:stats':
    
     filter, lag
    
    The following objects are masked from 'package:base':
    
     intersect, setdiff, setequal, union
    
    > dat <- tibble(group = rep(1:5, each = 2),
    + letter = c("a", "b",
    + "a", "c",
    + "a", "c",
    + "b", "e",
    + "b", "f"))
    >
    > # count the number of times two letters appear together
    > pairwise_count(dat, letter, group)
    Warning: `distinct_()` was deprecated in dplyr 0.7.0.
    Please use `distinct()` instead.
    See vignette('programming') for more help
    This warning is displayed once every 8 hours.
    Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated.
    Error in `colnames<-`(`*tmp*`, value = c("item1", "item2", "value")) :
     attempt to set 'colnames' on an object with less than two dimensions
    Calls: pairwise_count ... new_f -> %>% -> as_tibble -> custom_melt -> colnames<-
    Execution halted
Flavors: r-devel-linux-x86_64-debian-clang, r-release-linux-x86_64

Version: 0.1.4
Check: tests
Result: ERROR
     Running 'testthat.R' [8s/10s]
    Running the tests in 'tests/testthat.R' failed.
    Complete output:
     > library(testthat)
     > library(widyr)
     >
     > test_check("widyr")
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
    
     == Failed tests ================================================================
     -- Error (test-pairwise-count.R:16:3): pairing and counting works --------------
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     x
     1. +-original %>% ... at test-pairwise-count.R:16:2
     2. +-widyr::pairwise_count(...)
     3. | \-widyr::pairwise_count_(...)
     4. | \-... %>% rename(n = value)
     5. +-dplyr::rename(., n = value)
     6. +-widyr (local) func(., item, feature, wt)
     7. | \-widyr (local) new_f(tbl, item, feature, value, ...)
     8. | \-output %>% custom_melt() %>% as_tibble()
     9. +-tibble::as_tibble(.)
     10. \-widyr:::custom_melt(.)
     11. \-base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     -- Error (test-pairwise-count.R:63:3): We can count with a weight column -------
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     x
     1. +-widyr::pairwise_count(d, col2, col1) at test-pairwise-count.R:63:2
     2. | \-widyr::pairwise_count_(...)
     3. | \-... %>% rename(n = value)
     4. +-dplyr::rename(., n = value)
     5. +-widyr (local) func(., item, feature, wt)
     6. | \-widyr (local) new_f(tbl, item, feature, value, ...)
     7. | \-output %>% custom_melt() %>% as_tibble()
     8. +-tibble::as_tibble(.)
     9. \-widyr:::custom_melt(.)
     10. \-base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     -- Error (test-pairwise-count.R:79:5): Counts co-occurrences of words in Pride & Prejudice --
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     x
     1. +-words %>% ... at test-pairwise-count.R:79:4
     2. +-widyr::pairwise_count(...)
     3. | \-widyr::pairwise_count_(...)
     4. | \-... %>% rename(n = value)
     5. +-dplyr::rename(., n = value)
     6. +-widyr (local) func(., item, feature, wt)
     7. | \-widyr (local) new_f(tbl, item, feature, value, ...)
     8. | \-output %>% custom_melt() %>% as_tibble()
     9. +-tibble::as_tibble(.)
     10. \-widyr:::custom_melt(.)
     11. \-base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     -- Error (test-pairwise-count.R:104:3): Can count within groups ----------------
     <dplyr:::mutate_error/rlang_error/error/condition>
     Error in `mutate(., data = purrr::map(data, f, item, feature, value))`: Problem while computing `data = purrr::map(data, f, item, feature,
     value)`.
     i The error occurred in group 1: cyl = 4.
     Caused by error in `colnames<-`:
     ! attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     x
     1. +-mtcars %>% group_by(cyl) %>% pairwise_count(vs, am) at test-pairwise-count.R:104:2
     2. +-widyr::pairwise_count(., vs, am)
     3. | \-widyr::pairwise_count_(...)
     4. | \-... %>% rename(n = value)
     5. +-dplyr::rename(., n = value)
     6. +-widyr (local) func(., item, feature, wt)
     7. | \-... %>% dplyr::group_by_at(dplyr::group_vars(tbl))
     8. +-dplyr::group_by_at(., dplyr::group_vars(tbl))
     9. | \-dplyr:::manip_at(...)
     10. | \-dplyr:::tbl_at_syms(...)
     11. | \-dplyr:::tbl_at_vars(...)
     12. | \-dplyr::tbl_vars(tbl)
     13. | +-dplyr:::new_sel_vars(tbl_vars_dispatch(x), group_vars(x))
     14. | | \-base::structure(...)
     15. | \-dplyr:::tbl_vars_dispatch(x)
     16. +-tidyr::unnest(., data)
     17. +-dplyr::filter(., purrr::map_lgl(data, ~nrow(.) > 0))
     18. +-dplyr::mutate(., data = purrr::map(data, f, item, feature, value))
     19. +-dplyr:::mutate.data.frame(., data = purrr::map(data, f, item, feature, value))
     20. | \-dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
     21. | +-base::withCallingHandlers(...)
     22. | \-mask$eval_all_mutate(quo)
     23. +-purrr::map(data, f, item, feature, value)
     24. | \-widyr (local) .f(.x[[i]], ...)
     25. | \-widyr (local) new_f(tbl, item, feature, value, ...)
     26. | \-output %>% custom_melt() %>% as_tibble()
     27. +-tibble::as_tibble(.)
     28. +-widyr:::custom_melt(.)
     29. | \-base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     30. | \-base::stop("attempt to set 'colnames' on an object with less than two dimensions")
     31. \-base::.handleSimpleError(...)
     32. \-dplyr (local) h(simpleError(msg, call))
     33. \-rlang::abort(...)
     -- Error (test-pairwise-similarity.R:14:3): pairwise_similarity computes pairwise cosine similarity --
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     x
     1. +-d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:14:2
     2. +-widyr::pairwise_similarity(., col, row, value)
     3. | \-widyr::pairwise_similarity_(...)
     4. | \-tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. +-dplyr::rename(., similarity = value)
     6. +-widyr (local) d_func(., item, feature, value)
     7. | \-widyr (local) new_f(tbl, item, feature, value, ...)
     8. | \-output %>% custom_melt() %>% as_tibble()
     9. +-tibble::as_tibble(.)
     10. \-widyr:::custom_melt(.)
     11. \-base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     -- Error (test-pairwise-similarity.R:29:3): pairwise_similarity retains factor levels --
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     x
     1. +-d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:29:2
     2. +-widyr::pairwise_similarity(., col, row, value)
     3. | \-widyr::pairwise_similarity_(...)
     4. | \-tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. +-dplyr::rename(., similarity = value)
     6. +-widyr (local) d_func(., item, feature, value)
     7. | \-widyr (local) new_f(tbl, item, feature, value, ...)
     8. | \-output %>% custom_melt() %>% as_tibble()
     9. +-tibble::as_tibble(.)
     10. \-widyr:::custom_melt(.)
     11. \-base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
    
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
     Error: Test failures
     Execution halted
Flavor: r-devel-linux-x86_64-debian-clang

Version: 0.1.4
Check: examples
Result: ERROR
    Running examples in ‘widyr-Ex.R’ failed
    The error most likely occurred in:
    
    > base::assign(".ptime", proc.time(), pos = "CheckExEnv")
    > ### Name: pairwise_count
    > ### Title: Count pairs of items within a group
    > ### Aliases: pairwise_count pairwise_count_
    >
    > ### ** Examples
    >
    >
    > library(dplyr)
    
    Attaching package: ‘dplyr’
    
    The following objects are masked from ‘package:stats’:
    
     filter, lag
    
    The following objects are masked from ‘package:base’:
    
     intersect, setdiff, setequal, union
    
    > dat <- tibble(group = rep(1:5, each = 2),
    + letter = c("a", "b",
    + "a", "c",
    + "a", "c",
    + "b", "e",
    + "b", "f"))
    >
    > # count the number of times two letters appear together
    > pairwise_count(dat, letter, group)
    Warning: `distinct_()` was deprecated in dplyr 0.7.0.
    Please use `distinct()` instead.
    See vignette('programming') for more help
    Error in `colnames<-`(`*tmp*`, value = c("item1", "item2", "value")) :
     attempt to set 'colnames' on an object with less than two dimensions
    Calls: pairwise_count ... new_f -> %>% -> as_tibble -> custom_melt -> colnames<-
    Execution halted
Flavors: r-devel-linux-x86_64-debian-gcc, r-patched-linux-x86_64

Version: 0.1.4
Check: tests
Result: ERROR
     Running ‘testthat.R’ [5s/8s]
    Running the tests in ‘tests/testthat.R’ failed.
    Complete output:
     > library(testthat)
     > library(widyr)
     >
     > test_check("widyr")
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
    
     ══ Failed tests ════════════════════════════════════════════════════════════════
     ── Error (test-pairwise-count.R:16:3): pairing and counting works ──────────────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─original %>% ... at test-pairwise-count.R:16:2
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:63:3): We can count with a weight column ───────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─widyr::pairwise_count(d, col2, col1) at test-pairwise-count.R:63:2
     2. │ └─widyr::pairwise_count_(...)
     3. │ └─... %>% rename(n = value)
     4. ├─dplyr::rename(., n = value)
     5. ├─widyr (local) func(., item, feature, wt)
     6. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     7. │ └─output %>% custom_melt() %>% as_tibble()
     8. ├─tibble::as_tibble(.)
     9. └─widyr:::custom_melt(.)
     10. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:79:5): Counts co-occurrences of words in Pride & Prejudice ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─words %>% ... at test-pairwise-count.R:79:4
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:104:3): Can count within groups ────────────────
     <dplyr:::mutate_error/rlang_error/error/condition>
     Error in `mutate(., data = purrr::map(data, f, item, feature, value))`: Problem while computing `data = purrr::map(data, f, item, feature,
     value)`.
     ℹ The error occurred in group 1: cyl = 4.
     Caused by error in `colnames<-`:
     ! attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─mtcars %>% group_by(cyl) %>% pairwise_count(vs, am) at test-pairwise-count.R:104:2
     2. ├─widyr::pairwise_count(., vs, am)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─... %>% dplyr::group_by_at(dplyr::group_vars(tbl))
     8. ├─dplyr::group_by_at(., dplyr::group_vars(tbl))
     9. │ └─dplyr:::manip_at(...)
     10. │ └─dplyr:::tbl_at_syms(...)
     11. │ └─dplyr:::tbl_at_vars(...)
     12. │ └─dplyr::tbl_vars(tbl)
     13. │ ├─dplyr:::new_sel_vars(tbl_vars_dispatch(x), group_vars(x))
     14. │ │ └─base::structure(...)
     15. │ └─dplyr:::tbl_vars_dispatch(x)
     16. ├─tidyr::unnest(., data)
     17. ├─dplyr::filter(., purrr::map_lgl(data, ~nrow(.) > 0))
     18. ├─dplyr::mutate(., data = purrr::map(data, f, item, feature, value))
     19. ├─dplyr:::mutate.data.frame(., data = purrr::map(data, f, item, feature, value))
     20. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
     21. │ ├─base::withCallingHandlers(...)
     22. │ └─mask$eval_all_mutate(quo)
     23. ├─purrr::map(data, f, item, feature, value)
     24. │ └─widyr (local) .f(.x[[i]], ...)
     25. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     26. │ └─output %>% custom_melt() %>% as_tibble()
     27. ├─tibble::as_tibble(.)
     28. ├─widyr:::custom_melt(.)
     29. │ └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     30. │ └─base::stop("attempt to set 'colnames' on an object with less than two dimensions")
     31. └─base::.handleSimpleError(...)
     32. └─dplyr (local) h(simpleError(msg, call))
     33. └─rlang::abort(...)
     ── Error (test-pairwise-similarity.R:14:3): pairwise_similarity computes pairwise cosine similarity ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:14:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-similarity.R:29:3): pairwise_similarity retains factor levels ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:29:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
    
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
     Error: Test failures
     Execution halted
Flavor: r-devel-linux-x86_64-debian-gcc

Version: 0.1.4
Check: dependencies in R code
Result: NOTE
    Namespace in Imports field not imported from: ‘gapminder’
     All declared Imports should be used.
Flavors: r-devel-linux-x86_64-fedora-clang, r-devel-linux-x86_64-fedora-gcc, r-release-macos-arm64, r-release-macos-x86_64, r-oldrel-macos-arm64, r-oldrel-macos-x86_64

Version: 0.1.4
Check: examples
Result: ERROR
    Running examples in ‘widyr-Ex.R’ failed
    The error most likely occurred in:
    
    > ### Name: pairwise_count
    > ### Title: Count pairs of items within a group
    > ### Aliases: pairwise_count pairwise_count_
    >
    > ### ** Examples
    >
    >
    > library(dplyr)
    
    Attaching package: ‘dplyr’
    
    The following objects are masked from ‘package:stats’:
    
     filter, lag
    
    The following objects are masked from ‘package:base’:
    
     intersect, setdiff, setequal, union
    
    > dat <- tibble(group = rep(1:5, each = 2),
    + letter = c("a", "b",
    + "a", "c",
    + "a", "c",
    + "b", "e",
    + "b", "f"))
    >
    > # count the number of times two letters appear together
    > pairwise_count(dat, letter, group)
    Warning: `distinct_()` was deprecated in dplyr 0.7.0.
    Please use `distinct()` instead.
    See vignette('programming') for more help
    This warning is displayed once every 8 hours.
    Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated.
    Error in `colnames<-`(`*tmp*`, value = c("item1", "item2", "value")) :
     attempt to set 'colnames' on an object with less than two dimensions
    Calls: pairwise_count ... new_f -> %>% -> as_tibble -> custom_melt -> colnames<-
    Execution halted
Flavors: r-devel-linux-x86_64-fedora-clang, r-devel-linux-x86_64-fedora-gcc, r-devel-windows-x86_64, r-release-windows-x86_64, r-oldrel-windows-ix86+x86_64

Version: 0.1.4
Check: tests
Result: ERROR
     Running ‘testthat.R’ [9s/24s]
    Running the tests in ‘tests/testthat.R’ failed.
    Complete output:
     > library(testthat)
     > library(widyr)
     >
     > test_check("widyr")
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
    
     ══ Failed tests ════════════════════════════════════════════════════════════════
     ── Error (test-pairwise-count.R:16:3): pairing and counting works ──────────────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─original %>% ... at test-pairwise-count.R:16:2
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:63:3): We can count with a weight column ───────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─widyr::pairwise_count(d, col2, col1) at test-pairwise-count.R:63:2
     2. │ └─widyr::pairwise_count_(...)
     3. │ └─... %>% rename(n = value)
     4. ├─dplyr::rename(., n = value)
     5. ├─widyr (local) func(., item, feature, wt)
     6. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     7. │ └─output %>% custom_melt() %>% as_tibble()
     8. ├─tibble::as_tibble(.)
     9. └─widyr:::custom_melt(.)
     10. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:79:5): Counts co-occurrences of words in Pride & Prejudice ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─words %>% ... at test-pairwise-count.R:79:4
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:104:3): Can count within groups ────────────────
     <dplyr:::mutate_error/rlang_error/error/condition>
     Error in `mutate(., data = purrr::map(data, f, item, feature, value))`: Problem while computing `data = purrr::map(data, f, item, feature,
     value)`.
     ℹ The error occurred in group 1: cyl = 4.
     Caused by error in `colnames<-`:
     ! attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─mtcars %>% group_by(cyl) %>% pairwise_count(vs, am) at test-pairwise-count.R:104:2
     2. ├─widyr::pairwise_count(., vs, am)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─... %>% dplyr::group_by_at(dplyr::group_vars(tbl))
     8. ├─dplyr::group_by_at(., dplyr::group_vars(tbl))
     9. │ └─dplyr:::manip_at(...)
     10. │ └─dplyr:::tbl_at_syms(...)
     11. │ └─dplyr:::tbl_at_vars(...)
     12. │ └─dplyr::tbl_vars(tbl)
     13. │ ├─dplyr:::new_sel_vars(tbl_vars_dispatch(x), group_vars(x))
     14. │ │ └─base::structure(...)
     15. │ └─dplyr:::tbl_vars_dispatch(x)
     16. ├─tidyr::unnest(., data)
     17. ├─dplyr::filter(., purrr::map_lgl(data, ~nrow(.) > 0))
     18. ├─dplyr::mutate(., data = purrr::map(data, f, item, feature, value))
     19. ├─dplyr:::mutate.data.frame(., data = purrr::map(data, f, item, feature, value))
     20. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
     21. │ ├─base::withCallingHandlers(...)
     22. │ └─mask$eval_all_mutate(quo)
     23. ├─purrr::map(data, f, item, feature, value)
     24. │ └─widyr (local) .f(.x[[i]], ...)
     25. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     26. │ └─output %>% custom_melt() %>% as_tibble()
     27. ├─tibble::as_tibble(.)
     28. ├─widyr:::custom_melt(.)
     29. │ └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     30. │ └─base::stop("attempt to set 'colnames' on an object with less than two dimensions")
     31. └─base::.handleSimpleError(...)
     32. └─dplyr (local) h(simpleError(msg, call))
     33. └─rlang::abort(...)
     ── Error (test-pairwise-similarity.R:14:3): pairwise_similarity computes pairwise cosine similarity ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:14:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-similarity.R:29:3): pairwise_similarity retains factor levels ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:29:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
    
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
     Error: Test failures
     Execution halted
Flavor: r-devel-linux-x86_64-fedora-clang

Version: 0.1.4
Check: tests
Result: ERROR
     Running ‘testthat.R’ [9s/11s]
    Running the tests in ‘tests/testthat.R’ failed.
    Complete output:
     > library(testthat)
     > library(widyr)
     >
     > test_check("widyr")
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
    
     ══ Failed tests ════════════════════════════════════════════════════════════════
     ── Error (test-pairwise-count.R:16:3): pairing and counting works ──────────────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─original %>% ... at test-pairwise-count.R:16:2
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:63:3): We can count with a weight column ───────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─widyr::pairwise_count(d, col2, col1) at test-pairwise-count.R:63:2
     2. │ └─widyr::pairwise_count_(...)
     3. │ └─... %>% rename(n = value)
     4. ├─dplyr::rename(., n = value)
     5. ├─widyr (local) func(., item, feature, wt)
     6. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     7. │ └─output %>% custom_melt() %>% as_tibble()
     8. ├─tibble::as_tibble(.)
     9. └─widyr:::custom_melt(.)
     10. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:79:5): Counts co-occurrences of words in Pride & Prejudice ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─words %>% ... at test-pairwise-count.R:79:4
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:104:3): Can count within groups ────────────────
     <dplyr:::mutate_error/rlang_error/error/condition>
     Error in `mutate(., data = purrr::map(data, f, item, feature, value))`: Problem while computing `data = purrr::map(data, f, item, feature,
     value)`.
     ℹ The error occurred in group 1: cyl = 4.
     Caused by error in `colnames<-`:
     ! attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─mtcars %>% group_by(cyl) %>% pairwise_count(vs, am) at test-pairwise-count.R:104:2
     2. ├─widyr::pairwise_count(., vs, am)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─... %>% dplyr::group_by_at(dplyr::group_vars(tbl))
     8. ├─dplyr::group_by_at(., dplyr::group_vars(tbl))
     9. │ └─dplyr:::manip_at(...)
     10. │ └─dplyr:::tbl_at_syms(...)
     11. │ └─dplyr:::tbl_at_vars(...)
     12. │ └─dplyr::tbl_vars(tbl)
     13. │ ├─dplyr:::new_sel_vars(tbl_vars_dispatch(x), group_vars(x))
     14. │ │ └─base::structure(...)
     15. │ └─dplyr:::tbl_vars_dispatch(x)
     16. ├─tidyr::unnest(., data)
     17. ├─dplyr::filter(., purrr::map_lgl(data, ~nrow(.) > 0))
     18. ├─dplyr::mutate(., data = purrr::map(data, f, item, feature, value))
     19. ├─dplyr:::mutate.data.frame(., data = purrr::map(data, f, item, feature, value))
     20. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
     21. │ ├─base::withCallingHandlers(...)
     22. │ └─mask$eval_all_mutate(quo)
     23. ├─purrr::map(data, f, item, feature, value)
     24. │ └─widyr (local) .f(.x[[i]], ...)
     25. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     26. │ └─output %>% custom_melt() %>% as_tibble()
     27. ├─tibble::as_tibble(.)
     28. ├─widyr:::custom_melt(.)
     29. │ └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     30. │ └─base::stop("attempt to set 'colnames' on an object with less than two dimensions")
     31. └─base::.handleSimpleError(...)
     32. └─dplyr (local) h(simpleError(msg, call))
     33. └─rlang::abort(...)
     ── Error (test-pairwise-similarity.R:14:3): pairwise_similarity computes pairwise cosine similarity ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:14:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-similarity.R:29:3): pairwise_similarity retains factor levels ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:29:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
    
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
     Error: Test failures
     Execution halted
Flavor: r-devel-linux-x86_64-fedora-gcc

Version: 0.1.4
Check: tests
Result: ERROR
     Running 'testthat.R' [7s]
    Running the tests in 'tests/testthat.R' failed.
    Complete output:
     > library(testthat)
     > library(widyr)
     >
     > test_check("widyr")
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
    
     ══ Failed tests ════════════════════════════════════════════════════════════════
     ── Error (test-pairwise-count.R:16:3): pairing and counting works ──────────────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─original %>% ... at test-pairwise-count.R:16:2
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:63:3): We can count with a weight column ───────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─widyr::pairwise_count(d, col2, col1) at test-pairwise-count.R:63:2
     2. │ └─widyr::pairwise_count_(...)
     3. │ └─... %>% rename(n = value)
     4. ├─dplyr::rename(., n = value)
     5. ├─widyr (local) func(., item, feature, wt)
     6. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     7. │ └─output %>% custom_melt() %>% as_tibble()
     8. ├─tibble::as_tibble(.)
     9. └─widyr:::custom_melt(.)
     10. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:79:5): Counts co-occurrences of words in Pride & Prejudice ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─words %>% ... at test-pairwise-count.R:79:4
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:104:3): Can count within groups ────────────────
     <dplyr:::mutate_error/rlang_error/error/condition>
     Error in `mutate(., data = purrr::map(data, f, item, feature, value))`: Problem while computing `data = purrr::map(data, f, item, feature,
     value)`.
     ℹ The error occurred in group 1: cyl = 4.
     Caused by error in `colnames<-`:
     ! attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─mtcars %>% group_by(cyl) %>% pairwise_count(vs, am) at test-pairwise-count.R:104:2
     2. ├─widyr::pairwise_count(., vs, am)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─... %>% dplyr::group_by_at(dplyr::group_vars(tbl))
     8. ├─dplyr::group_by_at(., dplyr::group_vars(tbl))
     9. │ └─dplyr:::manip_at(...)
     10. │ └─dplyr:::tbl_at_syms(...)
     11. │ └─dplyr:::tbl_at_vars(...)
     12. │ └─dplyr::tbl_vars(tbl)
     13. │ ├─dplyr:::new_sel_vars(tbl_vars_dispatch(x), group_vars(x))
     14. │ │ └─base::structure(...)
     15. │ └─dplyr:::tbl_vars_dispatch(x)
     16. ├─tidyr::unnest(., data)
     17. ├─dplyr::filter(., purrr::map_lgl(data, ~nrow(.) > 0))
     18. ├─dplyr::mutate(., data = purrr::map(data, f, item, feature, value))
     19. ├─dplyr:::mutate.data.frame(., data = purrr::map(data, f, item, feature, value))
     20. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
     21. │ ├─base::withCallingHandlers(...)
     22. │ └─mask$eval_all_mutate(quo)
     23. ├─purrr::map(data, f, item, feature, value)
     24. │ └─widyr (local) .f(.x[[i]], ...)
     25. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     26. │ └─output %>% custom_melt() %>% as_tibble()
     27. ├─tibble::as_tibble(.)
     28. ├─widyr:::custom_melt(.)
     29. │ └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     30. │ └─base::stop("attempt to set 'colnames' on an object with less than two dimensions")
     31. └─base::.handleSimpleError(...)
     32. └─dplyr (local) h(simpleError(msg, call))
     33. └─rlang::abort(...)
     ── Error (test-pairwise-similarity.R:14:3): pairwise_similarity computes pairwise cosine similarity ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:14:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-similarity.R:29:3): pairwise_similarity retains factor levels ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:29:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
    
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
     Error: Test failures
     Execution halted
Flavor: r-devel-windows-x86_64

Version: 0.1.4
Check: tests
Result: ERROR
     Running ‘testthat.R’ [7s/9s]
    Running the tests in ‘tests/testthat.R’ failed.
    Complete output:
     > library(testthat)
     > library(widyr)
     >
     > test_check("widyr")
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
    
     ══ Failed tests ════════════════════════════════════════════════════════════════
     ── Error (test-pairwise-count.R:16:3): pairing and counting works ──────────────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─original %>% ... at test-pairwise-count.R:16:2
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:63:3): We can count with a weight column ───────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─widyr::pairwise_count(d, col2, col1) at test-pairwise-count.R:63:2
     2. │ └─widyr::pairwise_count_(...)
     3. │ └─... %>% rename(n = value)
     4. ├─dplyr::rename(., n = value)
     5. ├─widyr (local) func(., item, feature, wt)
     6. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     7. │ └─output %>% custom_melt() %>% as_tibble()
     8. ├─tibble::as_tibble(.)
     9. └─widyr:::custom_melt(.)
     10. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:79:5): Counts co-occurrences of words in Pride & Prejudice ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─words %>% ... at test-pairwise-count.R:79:4
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:104:3): Can count within groups ────────────────
     <dplyr:::mutate_error/rlang_error/error/condition>
     Error in `mutate(., data = purrr::map(data, f, item, feature, value))`: Problem while computing `data = purrr::map(data, f, item, feature,
     value)`.
     ℹ The error occurred in group 1: cyl = 4.
     Caused by error in `colnames<-`:
     ! attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─mtcars %>% group_by(cyl) %>% pairwise_count(vs, am) at test-pairwise-count.R:104:2
     2. ├─widyr::pairwise_count(., vs, am)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─... %>% dplyr::group_by_at(dplyr::group_vars(tbl))
     8. ├─dplyr::group_by_at(., dplyr::group_vars(tbl))
     9. │ └─dplyr:::manip_at(...)
     10. │ └─dplyr:::tbl_at_syms(...)
     11. │ └─dplyr:::tbl_at_vars(...)
     12. │ └─dplyr::tbl_vars(tbl)
     13. │ ├─dplyr:::new_sel_vars(tbl_vars_dispatch(x), group_vars(x))
     14. │ │ └─base::structure(...)
     15. │ └─dplyr:::tbl_vars_dispatch(x)
     16. ├─tidyr::unnest(., data)
     17. ├─dplyr::filter(., purrr::map_lgl(data, ~nrow(.) > 0))
     18. ├─dplyr::mutate(., data = purrr::map(data, f, item, feature, value))
     19. ├─dplyr:::mutate.data.frame(., data = purrr::map(data, f, item, feature, value))
     20. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
     21. │ ├─base::withCallingHandlers(...)
     22. │ └─mask$eval_all_mutate(quo)
     23. ├─purrr::map(data, f, item, feature, value)
     24. │ └─widyr (local) .f(.x[[i]], ...)
     25. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     26. │ └─output %>% custom_melt() %>% as_tibble()
     27. ├─tibble::as_tibble(.)
     28. ├─widyr:::custom_melt(.)
     29. │ └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     30. │ └─base::stop("attempt to set 'colnames' on an object with less than two dimensions")
     31. └─base::.handleSimpleError(...)
     32. └─dplyr (local) h(simpleError(msg, call))
     33. └─rlang::abort(...)
     ── Error (test-pairwise-similarity.R:14:3): pairwise_similarity computes pairwise cosine similarity ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:14:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-similarity.R:29:3): pairwise_similarity retains factor levels ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:29:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
    
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
     Error: Test failures
     Execution halted
Flavor: r-patched-linux-x86_64

Version: 0.1.4
Check: tests
Result: ERROR
     Running ‘testthat.R’ [7s/8s]
    Running the tests in ‘tests/testthat.R’ failed.
    Complete output:
     > library(testthat)
     > library(widyr)
     >
     > test_check("widyr")
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
    
     ══ Failed tests ════════════════════════════════════════════════════════════════
     ── Error (test-pairwise-count.R:16:3): pairing and counting works ──────────────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─original %>% ... at test-pairwise-count.R:16:2
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:63:3): We can count with a weight column ───────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─widyr::pairwise_count(d, col2, col1) at test-pairwise-count.R:63:2
     2. │ └─widyr::pairwise_count_(...)
     3. │ └─... %>% rename(n = value)
     4. ├─dplyr::rename(., n = value)
     5. ├─widyr (local) func(., item, feature, wt)
     6. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     7. │ └─output %>% custom_melt() %>% as_tibble()
     8. ├─tibble::as_tibble(.)
     9. └─widyr:::custom_melt(.)
     10. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:79:5): Counts co-occurrences of words in Pride & Prejudice ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─words %>% ... at test-pairwise-count.R:79:4
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:104:3): Can count within groups ────────────────
     <dplyr:::mutate_error/rlang_error/error/condition>
     Error in `mutate(., data = purrr::map(data, f, item, feature, value))`: Problem while computing `data = purrr::map(data, f, item, feature,
     value)`.
     ℹ The error occurred in group 1: cyl = 4.
     Caused by error in `colnames<-`:
     ! attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─mtcars %>% group_by(cyl) %>% pairwise_count(vs, am) at test-pairwise-count.R:104:2
     2. ├─widyr::pairwise_count(., vs, am)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─... %>% dplyr::group_by_at(dplyr::group_vars(tbl))
     8. ├─dplyr::group_by_at(., dplyr::group_vars(tbl))
     9. │ └─dplyr:::manip_at(...)
     10. │ └─dplyr:::tbl_at_syms(...)
     11. │ └─dplyr:::tbl_at_vars(...)
     12. │ └─dplyr::tbl_vars(tbl)
     13. │ ├─dplyr:::new_sel_vars(tbl_vars_dispatch(x), group_vars(x))
     14. │ │ └─base::structure(...)
     15. │ └─dplyr:::tbl_vars_dispatch(x)
     16. ├─tidyr::unnest(., data)
     17. ├─dplyr::filter(., purrr::map_lgl(data, ~nrow(.) > 0))
     18. ├─dplyr::mutate(., data = purrr::map(data, f, item, feature, value))
     19. ├─dplyr:::mutate.data.frame(., data = purrr::map(data, f, item, feature, value))
     20. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
     21. │ ├─base::withCallingHandlers(...)
     22. │ └─mask$eval_all_mutate(quo)
     23. ├─purrr::map(data, f, item, feature, value)
     24. │ └─widyr (local) .f(.x[[i]], ...)
     25. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     26. │ └─output %>% custom_melt() %>% as_tibble()
     27. ├─tibble::as_tibble(.)
     28. ├─widyr:::custom_melt(.)
     29. │ └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     30. │ └─base::stop("attempt to set 'colnames' on an object with less than two dimensions")
     31. └─base::.handleSimpleError(...)
     32. └─dplyr (local) h(simpleError(msg, call))
     33. └─rlang::abort(...)
     ── Error (test-pairwise-similarity.R:14:3): pairwise_similarity computes pairwise cosine similarity ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:14:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-similarity.R:29:3): pairwise_similarity retains factor levels ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:29:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
    
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
     Error: Test failures
     Execution halted
Flavor: r-release-linux-x86_64

Version: 0.1.4
Check: tests
Result: ERROR
     Running 'testthat.R' [8s]
    Running the tests in 'tests/testthat.R' failed.
    Complete output:
     > library(testthat)
     > library(widyr)
     >
     > test_check("widyr")
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
    
     ══ Failed tests ════════════════════════════════════════════════════════════════
     ── Error (test-pairwise-count.R:16:3): pairing and counting works ──────────────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─original %>% ... at test-pairwise-count.R:16:2
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:63:3): We can count with a weight column ───────
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─widyr::pairwise_count(d, col2, col1) at test-pairwise-count.R:63:2
     2. │ └─widyr::pairwise_count_(...)
     3. │ └─... %>% rename(n = value)
     4. ├─dplyr::rename(., n = value)
     5. ├─widyr (local) func(., item, feature, wt)
     6. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     7. │ └─output %>% custom_melt() %>% as_tibble()
     8. ├─tibble::as_tibble(.)
     9. └─widyr:::custom_melt(.)
     10. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:79:5): Counts co-occurrences of words in Pride & Prejudice ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─words %>% ... at test-pairwise-count.R:79:4
     2. ├─widyr::pairwise_count(...)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-count.R:104:3): Can count within groups ────────────────
     <dplyr:::mutate_error/rlang_error/error/condition>
     Error in `mutate(., data = purrr::map(data, f, item, feature, value))`: Problem while computing `data = purrr::map(data, f, item, feature,
     value)`.
     ℹ The error occurred in group 1: cyl = 4.
     Caused by error in `colnames<-`:
     ! attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─mtcars %>% group_by(cyl) %>% pairwise_count(vs, am) at test-pairwise-count.R:104:2
     2. ├─widyr::pairwise_count(., vs, am)
     3. │ └─widyr::pairwise_count_(...)
     4. │ └─... %>% rename(n = value)
     5. ├─dplyr::rename(., n = value)
     6. ├─widyr (local) func(., item, feature, wt)
     7. │ └─... %>% dplyr::group_by_at(dplyr::group_vars(tbl))
     8. ├─dplyr::group_by_at(., dplyr::group_vars(tbl))
     9. │ └─dplyr:::manip_at(...)
     10. │ └─dplyr:::tbl_at_syms(...)
     11. │ └─dplyr:::tbl_at_vars(...)
     12. │ └─dplyr::tbl_vars(tbl)
     13. │ ├─dplyr:::new_sel_vars(tbl_vars_dispatch(x), group_vars(x))
     14. │ │ └─base::structure(...)
     15. │ └─dplyr:::tbl_vars_dispatch(x)
     16. ├─tidyr::unnest(., data)
     17. ├─dplyr::filter(., purrr::map_lgl(data, ~nrow(.) > 0))
     18. ├─dplyr::mutate(., data = purrr::map(data, f, item, feature, value))
     19. ├─dplyr:::mutate.data.frame(., data = purrr::map(data, f, item, feature, value))
     20. │ └─dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
     21. │ ├─base::withCallingHandlers(...)
     22. │ └─mask$eval_all_mutate(quo)
     23. ├─purrr::map(data, f, item, feature, value)
     24. │ └─widyr (local) .f(.x[[i]], ...)
     25. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     26. │ └─output %>% custom_melt() %>% as_tibble()
     27. ├─tibble::as_tibble(.)
     28. ├─widyr:::custom_melt(.)
     29. │ └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     30. │ └─base::stop("attempt to set 'colnames' on an object with less than two dimensions")
     31. └─base::.handleSimpleError(...)
     32. └─dplyr (local) h(simpleError(msg, call))
     33. └─rlang::abort(...)
     ── Error (test-pairwise-similarity.R:14:3): pairwise_similarity computes pairwise cosine similarity ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:14:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     ── Error (test-pairwise-similarity.R:29:3): pairwise_similarity retains factor levels ──
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     ▆
     1. ├─d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:29:2
     2. ├─widyr::pairwise_similarity(., col, row, value)
     3. │ └─widyr::pairwise_similarity_(...)
     4. │ └─tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. ├─dplyr::rename(., similarity = value)
     6. ├─widyr (local) d_func(., item, feature, value)
     7. │ └─widyr (local) new_f(tbl, item, feature, value, ...)
     8. │ └─output %>% custom_melt() %>% as_tibble()
     9. ├─tibble::as_tibble(.)
     10. └─widyr:::custom_melt(.)
     11. └─base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
    
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
     Error: Test failures
     Execution halted
Flavor: r-release-windows-x86_64

Version: 0.1.4
Check: tests
Result: ERROR
     Running 'testthat.R' [8s]
    Running the tests in 'tests/testthat.R' failed.
    Complete output:
     > library(testthat)
     > library(widyr)
     >
     > test_check("widyr")
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
    
     == Failed tests ================================================================
     -- Error (test-pairwise-count.R:16:3): pairing and counting works --------------
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     x
     1. +-original %>% ... at test-pairwise-count.R:16:2
     2. +-widyr::pairwise_count(...)
     3. | \-widyr::pairwise_count_(...)
     4. | \-... %>% rename(n = value)
     5. +-dplyr::rename(., n = value)
     6. +-widyr (local) func(., item, feature, wt)
     7. | \-widyr (local) new_f(tbl, item, feature, value, ...)
     8. | \-output %>% custom_melt() %>% as_tibble()
     9. +-tibble::as_tibble(.)
     10. \-widyr:::custom_melt(.)
     11. \-base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     -- Error (test-pairwise-count.R:63:3): We can count with a weight column -------
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     x
     1. +-widyr::pairwise_count(d, col2, col1) at test-pairwise-count.R:63:2
     2. | \-widyr::pairwise_count_(...)
     3. | \-... %>% rename(n = value)
     4. +-dplyr::rename(., n = value)
     5. +-widyr (local) func(., item, feature, wt)
     6. | \-widyr (local) new_f(tbl, item, feature, value, ...)
     7. | \-output %>% custom_melt() %>% as_tibble()
     8. +-tibble::as_tibble(.)
     9. \-widyr:::custom_melt(.)
     10. \-base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     -- Error (test-pairwise-count.R:79:5): Counts co-occurrences of words in Pride & Prejudice --
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     x
     1. +-words %>% ... at test-pairwise-count.R:79:4
     2. +-widyr::pairwise_count(...)
     3. | \-widyr::pairwise_count_(...)
     4. | \-... %>% rename(n = value)
     5. +-dplyr::rename(., n = value)
     6. +-widyr (local) func(., item, feature, wt)
     7. | \-widyr (local) new_f(tbl, item, feature, value, ...)
     8. | \-output %>% custom_melt() %>% as_tibble()
     9. +-tibble::as_tibble(.)
     10. \-widyr:::custom_melt(.)
     11. \-base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     -- Error (test-pairwise-count.R:104:3): Can count within groups ----------------
     <dplyr:::mutate_error/rlang_error/error/condition>
     Error in `mutate(., data = purrr::map(data, f, item, feature, value))`: Problem while computing `data = purrr::map(data, f, item, feature,
     value)`.
     i The error occurred in group 1: cyl = 4.
     Caused by error in `colnames<-`:
     ! attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     x
     1. +-mtcars %>% group_by(cyl) %>% pairwise_count(vs, am) at test-pairwise-count.R:104:2
     2. +-widyr::pairwise_count(., vs, am)
     3. | \-widyr::pairwise_count_(...)
     4. | \-... %>% rename(n = value)
     5. +-dplyr::rename(., n = value)
     6. +-widyr (local) func(., item, feature, wt)
     7. | \-... %>% dplyr::group_by_at(dplyr::group_vars(tbl))
     8. +-dplyr::group_by_at(., dplyr::group_vars(tbl))
     9. | \-dplyr:::manip_at(...)
     10. | \-dplyr:::tbl_at_syms(...)
     11. | \-dplyr:::tbl_at_vars(...)
     12. | \-dplyr::tbl_vars(tbl)
     13. | +-dplyr:::new_sel_vars(tbl_vars_dispatch(x), group_vars(x))
     14. | | \-base::structure(...)
     15. | \-dplyr:::tbl_vars_dispatch(x)
     16. +-tidyr::unnest(., data)
     17. +-dplyr::filter(., purrr::map_lgl(data, ~nrow(.) > 0))
     18. +-dplyr::mutate(., data = purrr::map(data, f, item, feature, value))
     19. +-dplyr:::mutate.data.frame(., data = purrr::map(data, f, item, feature, value))
     20. | \-dplyr:::mutate_cols(.data, dplyr_quosures(...), caller_env = caller_env())
     21. | +-base::withCallingHandlers(...)
     22. | \-mask$eval_all_mutate(quo)
     23. +-purrr::map(data, f, item, feature, value)
     24. | \-widyr (local) .f(.x[[i]], ...)
     25. | \-widyr (local) new_f(tbl, item, feature, value, ...)
     26. | \-output %>% custom_melt() %>% as_tibble()
     27. +-tibble::as_tibble(.)
     28. +-widyr:::custom_melt(.)
     29. | \-base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     30. | \-base::stop("attempt to set 'colnames' on an object with less than two dimensions")
     31. \-base::.handleSimpleError(...)
     32. \-dplyr (local) h(simpleError(msg, call))
     33. \-rlang::abort(...)
     -- Error (test-pairwise-similarity.R:14:3): pairwise_similarity computes pairwise cosine similarity --
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     x
     1. +-d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:14:2
     2. +-widyr::pairwise_similarity(., col, row, value)
     3. | \-widyr::pairwise_similarity_(...)
     4. | \-tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. +-dplyr::rename(., similarity = value)
     6. +-widyr (local) d_func(., item, feature, value)
     7. | \-widyr (local) new_f(tbl, item, feature, value, ...)
     8. | \-output %>% custom_melt() %>% as_tibble()
     9. +-tibble::as_tibble(.)
     10. \-widyr:::custom_melt(.)
     11. \-base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
     -- Error (test-pairwise-similarity.R:29:3): pairwise_similarity retains factor levels --
     Error in ``colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))`: attempt to set 'colnames' on an object with less than two dimensions
     Backtrace:
     x
     1. +-d %>% pairwise_similarity(col, row, value) at test-pairwise-similarity.R:29:2
     2. +-widyr::pairwise_similarity(., col, row, value)
     3. | \-widyr::pairwise_similarity_(...)
     4. | \-tbl %>% d_func(item, feature, value) %>% rename(similarity = value)
     5. +-dplyr::rename(., similarity = value)
     6. +-widyr (local) d_func(., item, feature, value)
     7. | \-widyr (local) new_f(tbl, item, feature, value, ...)
     8. | \-output %>% custom_melt() %>% as_tibble()
     9. +-tibble::as_tibble(.)
     10. \-widyr:::custom_melt(.)
     11. \-base::`colnames<-`(`*tmp*`, value = c("item1", "item2", "value"))
    
     [ FAIL 6 | WARN 1 | SKIP 0 | PASS 40 ]
     Error: Test failures
     Execution halted
Flavor: r-oldrel-windows-ix86+x86_64