CRAN Package Check Results for Package fwb

Last updated on 2023-10-04 01:59:18 CEST.

Flavor Version Tinstall Tcheck Ttotal Status Flags
r-devel-linux-x86_64-debian-clang 0.1.1 3.86 32.49 36.35 ERROR
r-devel-linux-x86_64-debian-gcc 0.1.1 3.09 24.74 27.83 ERROR
r-devel-linux-x86_64-fedora-clang 0.1.2 54.40 OK
r-devel-linux-x86_64-fedora-gcc 0.1.2 59.15 OK
r-devel-windows-x86_64 0.1.1 4.00 48.00 52.00 ERROR
r-patched-linux-x86_64 0.1.1 3.75 38.87 42.62 OK
r-release-linux-x86_64 0.1.1 3.57 39.36 42.93 OK
r-release-macos-arm64 0.1.2 22.00 OK
r-release-macos-x86_64 0.1.2 46.00 OK
r-release-windows-x86_64 0.1.1 6.00 56.00 62.00 OK
r-oldrel-macos-arm64 0.1.2 25.00 OK
r-oldrel-macos-x86_64 0.1.1 30.00 OK
r-oldrel-windows-x86_64 0.1.1 5.00 58.00 63.00 OK

Check Details

Version: 0.1.1
Check: examples
Result: ERROR
    Running examples in ‘fwb-Ex.R’ failed
    The error most likely occurred in:
    
    > base::assign(".ptime", proc.time(), pos = "CheckExEnv")
    > ### Name: fwb
    > ### Title: Fractional Weighted Bootstrap
    > ### Aliases: fwb print.fwb
    >
    > ### ** Examples
    >
    > ## Don't show:
    > if (requireNamespace("survival", quietly = TRUE)) (if (getRversion() >= "3.4") withAutoprint else force)({ # examplesIf
    + ## End(Don't show)
    + # Performing a Weibull analysis of the Bearing Cage
    + # failure data as done in Xu et al. (2020)
    + data("bearingcage")
    +
    + weibull_est <- function(data, w) {
    + fit <- survival::survreg(survival::Surv(hours, failure) ~ 1,
    + data = data, weights = w,
    + dist = "weibull")
    +
    + c(eta = unname(exp(coef(fit))), beta = 1/fit$scale)
    + }
    +
    + boot_est <- fwb(bearingcage, statistic = weibull_est,
    + R = 199, verbose = FALSE)
    + boot_est
    +
    + #Get standard errors and CIs; uses bias-corrected
    + #percentile CI by default
    + summary(boot_est, ci.type = "bc")
    +
    + #Plot statistic distributions
    + plot(boot_est, index = "beta", type = "hist")
    +
    + ## Don't show:
    + }) # examplesIf
    > data("bearingcage")
    > weibull_est <- function(data, w) {
    + fit <- survival::survreg(survival::Surv(hours, failure) ~ 1, data = data, weights = w,
    + dist = "weibull")
    + c(eta = unname(exp(coef(fit))), beta = 1/fit$scale)
    + }
    > boot_est <- fwb(bearingcage, statistic = weibull_est, R = 199, verbose = FALSE)
    Error in `fwb()`:
    ! `cluster` must be atomic.
    Backtrace:
     ▆
     1. ├─(if (getRversion() >= "3.4") withAutoprint else force)(...)
     2. │ └─base::source(...)
     3. │ ├─base::withVisible(eval(ei, envir))
     4. │ └─base::eval(ei, envir)
     5. │ └─base::eval(ei, envir)
     6. └─fwb::fwb(bearingcage, statistic = weibull_est, R = 199, verbose = FALSE)
     7. └─chk::chk_atomic(cluster)
     8. └─chk::abort_chk(x_name, " must be atomic", x = x)
     9. └─chk::err(..., n = n, tidy = tidy, class = "chk_error", call = call)
     10. └─rlang::abort(msg, class = class, !!!args[named], call = call)
    Execution halted
Flavors: r-devel-linux-x86_64-debian-clang, r-devel-linux-x86_64-debian-gcc

Version: 0.1.1
Check: examples
Result: ERROR
    Running examples in 'fwb-Ex.R' failed
    The error most likely occurred in:
    
    > ### Name: fwb
    > ### Title: Fractional Weighted Bootstrap
    > ### Aliases: fwb print.fwb
    >
    > ### ** Examples
    >
    > ## Don't show:
    > if (requireNamespace("survival", quietly = TRUE)) (if (getRversion() >= "3.4") withAutoprint else force)({ # examplesIf
    + ## End(Don't show)
    + # Performing a Weibull analysis of the Bearing Cage
    + # failure data as done in Xu et al. (2020)
    + data("bearingcage")
    +
    + weibull_est <- function(data, w) {
    + fit <- survival::survreg(survival::Surv(hours, failure) ~ 1,
    + data = data, weights = w,
    + dist = "weibull")
    +
    + c(eta = unname(exp(coef(fit))), beta = 1/fit$scale)
    + }
    +
    + boot_est <- fwb(bearingcage, statistic = weibull_est,
    + R = 199, verbose = FALSE)
    + boot_est
    +
    + #Get standard errors and CIs; uses bias-corrected
    + #percentile CI by default
    + summary(boot_est, ci.type = "bc")
    +
    + #Plot statistic distributions
    + plot(boot_est, index = "beta", type = "hist")
    +
    + ## Don't show:
    + }) # examplesIf
    > data("bearingcage")
    > weibull_est <- function(data, w) {
    + fit <- survival::survreg(survival::Surv(hours, failure) ~ 1, data = data, weights = w,
    + dist = "weibull")
    + c(eta = unname(exp(coef(fit))), beta = 1/fit$scale)
    + }
    > boot_est <- fwb(bearingcage, statistic = weibull_est, R = 199, verbose = FALSE)
    Error in `fwb()`:
    ! `cluster` must be atomic.
    Backtrace:
     ▆
     1. ├─(if (getRversion() >= "3.4") withAutoprint else force)(...)
     2. │ └─base::source(...)
     3. │ ├─base::withVisible(eval(ei, envir))
     4. │ └─base::eval(ei, envir)
     5. │ └─base::eval(ei, envir)
     6. └─fwb::fwb(bearingcage, statistic = weibull_est, R = 199, verbose = FALSE)
     7. └─chk::chk_atomic(cluster)
     8. └─chk::abort_chk(x_name, " must be atomic", x = x)
     9. └─chk::err(..., n = n, tidy = tidy, class = "chk_error", call = call)
     10. └─rlang::abort(msg, class = class, !!!args[named], call = call)
    Execution halted
Flavor: r-devel-windows-x86_64