CRAN Package Check Results for Package nandb

Last updated on 2023-01-25 04:51:42 CET.

Flavor Version Tinstall Tcheck Ttotal Status Flags
r-devel-linux-x86_64-debian-clang 2.1.0 49.08 235.76 284.84 OK
r-devel-linux-x86_64-debian-gcc 2.1.0 35.27 166.66 201.93 OK
r-devel-linux-x86_64-fedora-clang 2.1.0 338.51 ERROR
r-devel-linux-x86_64-fedora-gcc 2.1.0 331.57 ERROR
r-patched-linux-x86_64 2.1.0 38.85 217.18 256.03 OK
r-release-linux-x86_64 2.1.0 27.95 218.27 246.22 OK
r-release-macos-arm64 2.1.0 81.00 OK
r-release-macos-x86_64 2.1.0 145.00 OK
r-release-windows-x86_64 2.1.0 60.00 238.00 298.00 OK
r-oldrel-macos-arm64 2.1.0 84.00 OK
r-oldrel-macos-x86_64 2.1.0 138.00 OK
r-oldrel-windows-ix86+x86_64 2.1.0 116.00 250.00 366.00 OK

Check Details

Version: 2.1.0
Check: tests
Result: ERROR
     Running ‘spelling.R’
     Running ‘testthat.R’ [98s/66s]
    Running the tests in ‘tests/testthat.R’ failed.
    Complete output:
     > library(testthat)
     > library(nandb)
     >
     > if (!nandb:::win32bit()) test_check("nandb")
     Starting 2 test processes
     [ FAIL 8 | WARN 0 | SKIP 0 | PASS 128 ]
    
     ══ Failed tests ════════════════════════════════════════════════════════════════
     ── Error ('test-brightness.R:50'): brightness_folder works ─────────────────────
     <purrr_error_indexed/rlang_error/error/condition>
     Error in `purrr::map(file_names, brightness_file, def = def, thresh = thresh,
     detrend = detrend, quick = quick, filt = filt, s = s, offset = offset,
     readout_noise = readout_noise, parallel = parallel)`: i In index: 1.
     Caused by error in `string %>% tools::file_path_sans_ext() %T>% {
     .[(string == .) & (str_elem(., 1) == ".")] <- ""
     }`:
     ! could not find function "%T>%"
     Backtrace:
     ▆
     1. ├─base::suppressMessages(brightness_folder(def = "b", detrend = FALSE)) at test-brightness.R:50:2
     2. │ └─base::withCallingHandlers(...)
     3. ├─nandb::brightness_folder(def = "b", detrend = FALSE)
     4. │ ├─... %>% invisible()
     5. │ └─purrr::map(...)
     6. │ └─purrr:::map_("list", .x, .f, ..., .progress = .progress)
     7. │ ├─purrr:::with_indexed_errors(...)
     8. │ │ └─base::withCallingHandlers(...)
     9. │ ├─purrr:::call_with_cleanup(...)
     10. │ └─nandb (local) .f(.x[[i]], ...)
     11. │ └─... %>% deduplicate_nb_filename()
     12. ├─nandb:::deduplicate_nb_filename(.)
     13. │ └─checkmate::assert_string(path)
     14. │ └─checkmate::checkString(...)
     15. │ └─... %and% ...
     16. │ └─base::isTRUE(lhs)
     17. ├─base::paste0("brightness", "/", ., make_nb_filename_ending(b))
     18. ├─filesstrings::before_last_dot(.)
     19. └─base::.handleSimpleError(...)
     20. └─purrr (local) h(simpleError(msg, call))
     21. └─cli::cli_abort(...)
     22. └─rlang::abort(...)
     ── Error ('test-brightness.R:172'): brightness_timeseries works ────────────────
     Error in `argchk_write_tif(img = img, path = path, bits_per_sample = bits_per_sample,
     compression = compression, overwrite = overwrite, msg = msg)`: The file 50.tif, already exists and `overwrite` is set to `FALSE`.
     x To enable overwriting, use `overwrite = TRUE`.
     Backtrace:
     ▆
     1. └─ijtiff::write_tif(img, "50.tif", msg = FALSE) at test-brightness.R:172:2
     2. ├─... %<-% ...
     3. │ ├─base::tryCatch(...)
     4. │ │ └─base (local) tryCatchList(expr, classes, parentenv, handlers)
     5. │ │ ├─base (local) tryCatchOne(...)
     6. │ │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     7. │ │ └─base (local) tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     8. │ │ └─base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]])
     9. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     10. │ └─zeallot:::multi_assign(substitute(x), value, parent.frame())
     11. └─ijtiff:::argchk_write_tif(...)
     12. └─rlang::abort(...)
     ── Error ('test-cc_brightness.R:152'): cc_brightness_folder() works ────────────
     <purrr_error_indexed/rlang_error/error/condition>
     Error in `purrr::map(file_names, cc_brightness_file, ch1 = ch1, ch2 = ch2,
     thresh = thresh, detrend = detrend, quick = quick, filt = filt,
     parallel = parallel)`: i In index: 1.
     Caused by error in `string %>% tools::file_path_sans_ext() %T>% {
     .[(string == .) & (str_elem(., 1) == ".")] <- ""
     }`:
     ! could not find function "%T>%"
     Backtrace:
     ▆
     1. ├─nandb::cc_brightness_folder(thresh = "Huang", detrend = FALSE) at test-cc_brightness.R:152:2
     2. │ ├─... %>% invisible()
     3. │ └─purrr::map(...)
     4. │ └─purrr:::map_("list", .x, .f, ..., .progress = .progress)
     5. │ ├─purrr:::with_indexed_errors(...)
     6. │ │ └─base::withCallingHandlers(...)
     7. │ ├─purrr:::call_with_cleanup(...)
     8. │ └─nandb (local) .f(.x[[i]], ...)
     9. │ └─... %>% deduplicate_cc_nb_filename()
     10. ├─nandb:::deduplicate_cc_nb_filename(.)
     11. │ └─checkmate::assert_string(path)
     12. │ └─checkmate::checkString(...)
     13. │ └─... %and% ...
     14. │ └─base::isTRUE(lhs)
     15. ├─base::paste0("cc_brightness", "/", ., make_cc_nb_filename_ending(cc_b))
     16. ├─filesstrings::before_last_dot(.)
     17. └─base::.handleSimpleError(...)
     18. └─purrr (local) h(simpleError(msg, call))
     19. └─cli::cli_abort(...)
     20. └─rlang::abort(...)
     ── Error ('test-cc_brightness.R:175'): cc_brightness_timeseries_folder() works ──
     Error in `argchk_write_tif(img = img, path = path, bits_per_sample = bits_per_sample,
     compression = compression, overwrite = overwrite, msg = msg)`: The file a.tif, already exists and `overwrite` is set to `FALSE`.
     x To enable overwriting, use `overwrite = TRUE`.
     Backtrace:
     ▆
     1. └─ijtiff::write_tif(img, "a.tif", msg = FALSE) at test-cc_brightness.R:175:2
     2. ├─... %<-% ...
     3. │ ├─base::tryCatch(...)
     4. │ │ └─base (local) tryCatchList(expr, classes, parentenv, handlers)
     5. │ │ ├─base (local) tryCatchOne(...)
     6. │ │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     7. │ │ └─base (local) tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     8. │ │ └─base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]])
     9. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     10. │ └─zeallot:::multi_assign(substitute(x), value, parent.frame())
     11. └─ijtiff:::argchk_write_tif(...)
     12. └─rlang::abort(...)
     ── Error ('test-cc_number.R:156'): cc_number_folder() works ────────────────────
     <purrr_error_indexed/rlang_error/error/condition>
     Error in `purrr::map(file_names, cc_number_file, ch1 = ch1, ch2 = ch2,
     thresh = thresh, detrend = detrend, quick = quick, filt = filt,
     parallel = parallel)`: i In index: 1.
     Caused by error in `custom_stop()`:
     ! You have requested to use channel 2, but your image has only 1 channel in total.
     * This is not possible. Please retry with valid channel numbers.
     ── Error ('test-cc_number.R:180'): cc_number_timeseries_folder() works ─────────
     Error in `argchk_write_tif(img = img, path = path, bits_per_sample = bits_per_sample,
     compression = compression, overwrite = overwrite, msg = msg)`: The file a.tif, already exists and `overwrite` is set to `FALSE`.
     x To enable overwriting, use `overwrite = TRUE`.
     Backtrace:
     ▆
     1. └─ijtiff::write_tif(img, "a.tif", msg = FALSE) at test-cc_number.R:180:2
     2. ├─... %<-% ...
     3. │ ├─base::tryCatch(...)
     4. │ │ └─base (local) tryCatchList(expr, classes, parentenv, handlers)
     5. │ │ ├─base (local) tryCatchOne(...)
     6. │ │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     7. │ │ └─base (local) tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     8. │ │ └─base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]])
     9. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     10. │ └─zeallot:::multi_assign(substitute(x), value, parent.frame())
     11. └─ijtiff:::argchk_write_tif(...)
     12. └─rlang::abort(...)
     ── Error ('test-number.R:49'): number_folder works ─────────────────────────────
     <purrr_error_indexed/rlang_error/error/condition>
     Error in `purrr::map(file_names, number_file, def = def, thresh = thresh,
     detrend = detrend, quick = quick, filt = filt, s = s, offset = offset,
     readout_noise = readout_noise, gamma = gamma, parallel = parallel)`: i In index: 1.
     Caused by error in `string %>% tools::file_path_sans_ext() %T>% {
     .[(string == .) & (str_elem(., 1) == ".")] <- ""
     }`:
     ! could not find function "%T>%"
     Backtrace:
     ▆
     1. ├─nandb::number_folder(def = "N", detrend = FALSE) at test-number.R:49:2
     2. │ ├─... %>% invisible()
     3. │ └─purrr::map(...)
     4. │ └─purrr:::map_("list", .x, .f, ..., .progress = .progress)
     5. │ ├─purrr:::with_indexed_errors(...)
     6. │ │ └─base::withCallingHandlers(...)
     7. │ ├─purrr:::call_with_cleanup(...)
     8. │ └─nandb (local) .f(.x[[i]], ...)
     9. │ └─... %>% deduplicate_nb_filename()
     10. ├─nandb:::deduplicate_nb_filename(.)
     11. │ └─checkmate::assert_string(path)
     12. │ └─checkmate::checkString(...)
     13. │ └─... %and% ...
     14. │ └─base::isTRUE(lhs)
     15. ├─base::paste0("number", "/", ., make_nb_filename_ending(num))
     16. ├─filesstrings::before_last_dot(.)
     17. └─base::.handleSimpleError(...)
     18. └─purrr (local) h(simpleError(msg, call))
     19. └─cli::cli_abort(...)
     20. └─rlang::abort(...)
     ── Error ('test-number.R:168'): number_timeseries works ────────────────────────
     Error in `argchk_write_tif(img = img, path = path, bits_per_sample = bits_per_sample,
     compression = compression, overwrite = overwrite, msg = msg)`: The file 50.tif, already exists and `overwrite` is set to `FALSE`.
     x To enable overwriting, use `overwrite = TRUE`.
     Backtrace:
     ▆
     1. └─ijtiff::write_tif(img, "50.tif", msg = FALSE) at test-number.R:168:2
     2. ├─... %<-% ...
     3. │ ├─base::tryCatch(...)
     4. │ │ └─base (local) tryCatchList(expr, classes, parentenv, handlers)
     5. │ │ ├─base (local) tryCatchOne(...)
     6. │ │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     7. │ │ └─base (local) tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     8. │ │ └─base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]])
     9. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     10. │ └─zeallot:::multi_assign(substitute(x), value, parent.frame())
     11. └─ijtiff:::argchk_write_tif(...)
     12. └─rlang::abort(...)
    
     [ FAIL 8 | WARN 0 | SKIP 0 | PASS 128 ]
     Error: Test failures
     Execution halted
Flavor: r-devel-linux-x86_64-fedora-clang

Version: 2.1.0
Check: tests
Result: ERROR
     Running ‘spelling.R’
     Running ‘testthat.R’ [100s/55s]
    Running the tests in ‘tests/testthat.R’ failed.
    Complete output:
     > library(testthat)
     > library(nandb)
     >
     > if (!nandb:::win32bit()) test_check("nandb")
     Starting 2 test processes
     [ FAIL 8 | WARN 0 | SKIP 0 | PASS 128 ]
    
     ══ Failed tests ════════════════════════════════════════════════════════════════
     ── Error ('test-brightness.R:50'): brightness_folder works ─────────────────────
     <purrr_error_indexed/rlang_error/error/condition>
     Error in `purrr::map(file_names, brightness_file, def = def, thresh = thresh,
     detrend = detrend, quick = quick, filt = filt, s = s, offset = offset,
     readout_noise = readout_noise, parallel = parallel)`: i In index: 1.
     Caused by error in `string %>% tools::file_path_sans_ext() %T>% {
     .[(string == .) & (str_elem(., 1) == ".")] <- ""
     }`:
     ! could not find function "%T>%"
     Backtrace:
     ▆
     1. ├─base::suppressMessages(brightness_folder(def = "b", detrend = FALSE)) at test-brightness.R:50:2
     2. │ └─base::withCallingHandlers(...)
     3. ├─nandb::brightness_folder(def = "b", detrend = FALSE)
     4. │ ├─... %>% invisible()
     5. │ └─purrr::map(...)
     6. │ └─purrr:::map_("list", .x, .f, ..., .progress = .progress)
     7. │ ├─purrr:::with_indexed_errors(...)
     8. │ │ └─base::withCallingHandlers(...)
     9. │ ├─purrr:::call_with_cleanup(...)
     10. │ └─nandb (local) .f(.x[[i]], ...)
     11. │ └─... %>% deduplicate_nb_filename()
     12. ├─nandb:::deduplicate_nb_filename(.)
     13. │ └─checkmate::assert_string(path)
     14. │ └─checkmate::checkString(...)
     15. │ └─... %and% ...
     16. │ └─base::isTRUE(lhs)
     17. ├─base::paste0("brightness", "/", ., make_nb_filename_ending(b))
     18. ├─filesstrings::before_last_dot(.)
     19. └─base::.handleSimpleError(...)
     20. └─purrr (local) h(simpleError(msg, call))
     21. └─cli::cli_abort(...)
     22. └─rlang::abort(...)
     ── Error ('test-brightness.R:172'): brightness_timeseries works ────────────────
     Error in `argchk_write_tif(img = img, path = path, bits_per_sample = bits_per_sample,
     compression = compression, overwrite = overwrite, msg = msg)`: The file 50.tif, already exists and `overwrite` is set to `FALSE`.
     x To enable overwriting, use `overwrite = TRUE`.
     Backtrace:
     ▆
     1. └─ijtiff::write_tif(img, "50.tif", msg = FALSE) at test-brightness.R:172:2
     2. ├─... %<-% ...
     3. │ ├─base::tryCatch(...)
     4. │ │ └─base (local) tryCatchList(expr, classes, parentenv, handlers)
     5. │ │ ├─base (local) tryCatchOne(...)
     6. │ │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     7. │ │ └─base (local) tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     8. │ │ └─base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]])
     9. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     10. │ └─zeallot:::multi_assign(substitute(x), value, parent.frame())
     11. └─ijtiff:::argchk_write_tif(...)
     12. └─rlang::abort(...)
     ── Error ('test-cc_brightness.R:152'): cc_brightness_folder() works ────────────
     <purrr_error_indexed/rlang_error/error/condition>
     Error in `purrr::map(file_names, cc_brightness_file, ch1 = ch1, ch2 = ch2,
     thresh = thresh, detrend = detrend, quick = quick, filt = filt,
     parallel = parallel)`: i In index: 1.
     Caused by error in `string %>% tools::file_path_sans_ext() %T>% {
     .[(string == .) & (str_elem(., 1) == ".")] <- ""
     }`:
     ! could not find function "%T>%"
     Backtrace:
     ▆
     1. ├─nandb::cc_brightness_folder(thresh = "Huang", detrend = FALSE) at test-cc_brightness.R:152:2
     2. │ ├─... %>% invisible()
     3. │ └─purrr::map(...)
     4. │ └─purrr:::map_("list", .x, .f, ..., .progress = .progress)
     5. │ ├─purrr:::with_indexed_errors(...)
     6. │ │ └─base::withCallingHandlers(...)
     7. │ ├─purrr:::call_with_cleanup(...)
     8. │ └─nandb (local) .f(.x[[i]], ...)
     9. │ └─... %>% deduplicate_cc_nb_filename()
     10. ├─nandb:::deduplicate_cc_nb_filename(.)
     11. │ └─checkmate::assert_string(path)
     12. │ └─checkmate::checkString(...)
     13. │ └─... %and% ...
     14. │ └─base::isTRUE(lhs)
     15. ├─base::paste0("cc_brightness", "/", ., make_cc_nb_filename_ending(cc_b))
     16. ├─filesstrings::before_last_dot(.)
     17. └─base::.handleSimpleError(...)
     18. └─purrr (local) h(simpleError(msg, call))
     19. └─cli::cli_abort(...)
     20. └─rlang::abort(...)
     ── Error ('test-cc_brightness.R:175'): cc_brightness_timeseries_folder() works ──
     Error in `argchk_write_tif(img = img, path = path, bits_per_sample = bits_per_sample,
     compression = compression, overwrite = overwrite, msg = msg)`: The file a.tif, already exists and `overwrite` is set to `FALSE`.
     x To enable overwriting, use `overwrite = TRUE`.
     Backtrace:
     ▆
     1. └─ijtiff::write_tif(img, "a.tif", msg = FALSE) at test-cc_brightness.R:175:2
     2. ├─... %<-% ...
     3. │ ├─base::tryCatch(...)
     4. │ │ └─base (local) tryCatchList(expr, classes, parentenv, handlers)
     5. │ │ ├─base (local) tryCatchOne(...)
     6. │ │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     7. │ │ └─base (local) tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     8. │ │ └─base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]])
     9. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     10. │ └─zeallot:::multi_assign(substitute(x), value, parent.frame())
     11. └─ijtiff:::argchk_write_tif(...)
     12. └─rlang::abort(...)
     ── Error ('test-number.R:49'): number_folder works ─────────────────────────────
     <purrr_error_indexed/rlang_error/error/condition>
     Error in `purrr::map(file_names, number_file, def = def, thresh = thresh,
     detrend = detrend, quick = quick, filt = filt, s = s, offset = offset,
     readout_noise = readout_noise, gamma = gamma, parallel = parallel)`: i In index: 1.
     Caused by error in `string %>% tools::file_path_sans_ext() %T>% {
     .[(string == .) & (str_elem(., 1) == ".")] <- ""
     }`:
     ! could not find function "%T>%"
     Backtrace:
     ▆
     1. ├─nandb::number_folder(def = "N", detrend = FALSE) at test-number.R:49:2
     2. │ ├─... %>% invisible()
     3. │ └─purrr::map(...)
     4. │ └─purrr:::map_("list", .x, .f, ..., .progress = .progress)
     5. │ ├─purrr:::with_indexed_errors(...)
     6. │ │ └─base::withCallingHandlers(...)
     7. │ ├─purrr:::call_with_cleanup(...)
     8. │ └─nandb (local) .f(.x[[i]], ...)
     9. │ └─... %>% deduplicate_nb_filename()
     10. ├─nandb:::deduplicate_nb_filename(.)
     11. │ └─checkmate::assert_string(path)
     12. │ └─checkmate::checkString(...)
     13. │ └─... %and% ...
     14. │ └─base::isTRUE(lhs)
     15. ├─base::paste0("number", "/", ., make_nb_filename_ending(num))
     16. ├─filesstrings::before_last_dot(.)
     17. └─base::.handleSimpleError(...)
     18. └─purrr (local) h(simpleError(msg, call))
     19. └─cli::cli_abort(...)
     20. └─rlang::abort(...)
     ── Error ('test-number.R:168'): number_timeseries works ────────────────────────
     Error in `argchk_write_tif(img = img, path = path, bits_per_sample = bits_per_sample,
     compression = compression, overwrite = overwrite, msg = msg)`: The file 50.tif, already exists and `overwrite` is set to `FALSE`.
     x To enable overwriting, use `overwrite = TRUE`.
     Backtrace:
     ▆
     1. └─ijtiff::write_tif(img, "50.tif", msg = FALSE) at test-number.R:168:2
     2. ├─... %<-% ...
     3. │ ├─base::tryCatch(...)
     4. │ │ └─base (local) tryCatchList(expr, classes, parentenv, handlers)
     5. │ │ ├─base (local) tryCatchOne(...)
     6. │ │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     7. │ │ └─base (local) tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     8. │ │ └─base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]])
     9. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     10. │ └─zeallot:::multi_assign(substitute(x), value, parent.frame())
     11. └─ijtiff:::argchk_write_tif(...)
     12. └─rlang::abort(...)
     ── Error ('test-cc_number.R:156'): cc_number_folder() works ────────────────────
     <purrr_error_indexed/rlang_error/error/condition>
     Error in `purrr::map(file_names, cc_number_file, ch1 = ch1, ch2 = ch2,
     thresh = thresh, detrend = detrend, quick = quick, filt = filt,
     parallel = parallel)`: i In index: 1.
     Caused by error in `custom_stop()`:
     ! You have requested to use channel 2, but your image has only 1 channel in total.
     * This is not possible. Please retry with valid channel numbers.
     ── Error ('test-cc_number.R:180'): cc_number_timeseries_folder() works ─────────
     Error in `argchk_write_tif(img = img, path = path, bits_per_sample = bits_per_sample,
     compression = compression, overwrite = overwrite, msg = msg)`: The file a.tif, already exists and `overwrite` is set to `FALSE`.
     x To enable overwriting, use `overwrite = TRUE`.
     Backtrace:
     ▆
     1. └─ijtiff::write_tif(img, "a.tif", msg = FALSE) at test-cc_number.R:180:2
     2. ├─... %<-% ...
     3. │ ├─base::tryCatch(...)
     4. │ │ └─base (local) tryCatchList(expr, classes, parentenv, handlers)
     5. │ │ ├─base (local) tryCatchOne(...)
     6. │ │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     7. │ │ └─base (local) tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     8. │ │ └─base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]])
     9. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler)
     10. │ └─zeallot:::multi_assign(substitute(x), value, parent.frame())
     11. └─ijtiff:::argchk_write_tif(...)
     12. └─rlang::abort(...)
    
     [ FAIL 8 | WARN 0 | SKIP 0 | PASS 128 ]
     Error: Test failures
     Execution halted
Flavor: r-devel-linux-x86_64-fedora-gcc