Last updated on 2022-09-11 12:56:22 CEST.
Flavor | Version | Tinstall | Tcheck | Ttotal | Status | Flags |
---|---|---|---|---|---|---|
r-devel-linux-x86_64-debian-clang | 0.7.0 | 66.24 | 156.37 | 222.61 | OK | |
r-devel-linux-x86_64-debian-gcc | 0.7.0 | 54.77 | 116.44 | 171.21 | OK | |
r-devel-linux-x86_64-fedora-clang | 0.7.0 | 308.93 | OK | |||
r-devel-linux-x86_64-fedora-gcc | 0.7.0 | 251.03 | ERROR | |||
r-devel-windows-x86_64 | 0.7.0 | 87.00 | 210.00 | 297.00 | OK | |
r-patched-linux-x86_64 | 0.7.0 | 59.78 | 142.03 | 201.81 | OK | |
r-release-linux-x86_64 | 0.7.0 | 57.68 | 144.60 | 202.28 | OK | |
r-release-macos-arm64 | 0.7.0 | 71.00 | OK | |||
r-release-macos-x86_64 | 0.7.0 | 97.00 | OK | |||
r-release-windows-x86_64 | 0.7.0 | 79.00 | 204.00 | 283.00 | OK | |
r-oldrel-macos-arm64 | 0.7.0 | 80.00 | NOTE | |||
r-oldrel-macos-x86_64 | 0.7.0 | 92.00 | OK | |||
r-oldrel-windows-ix86+x86_64 | 0.7.0 | 160.00 | 248.00 | 408.00 | OK |
Version: 0.7.0
Check: examples
Result: ERROR
Running examples in ‘mcglm-Ex.R’ failed
The error most likely occurred in:
> ### Name: Hunting
> ### Title: Hunting in Pico Basile, Bioko Island, Equatorial Guinea.
> ### Aliases: Hunting
> ### Keywords: datasets
>
> ### ** Examples
>
> library(mcglm)
> library(Matrix)
> data(Hunting, package="mcglm")
> formu <- OT ~ METHOD*ALT + SEX + ALT*poly(MONTH, 4)
> Z0 <- mc_id(Hunting)
> Z1 <- mc_mixed(~0 + HUNTER.MONTH, data = Hunting)
> fit <- mcglm(linear_pred = c(formu), matrix_pred = list(c(Z0, Z1)),
+ link = c("log"), variance = c("poisson_tweedie"),
+ power_fixed = c(FALSE),
+ control_algorithm = list(max_iter = 100),
+ offset = list(log(Hunting$OFFSET)), data = Hunting)
Automatic initial values selected.
Error in (function (classes, fdef, mtable) :
unable to find an inherited method for function ‘forceSymmetric’ for signature ‘"dgCMatrix", "logical"’
Error in model_fit$IterationCovariance :
$ operator is invalid for atomic vectors
Calls: mcglm -> na.exclude
Execution halted
Flavor: r-devel-linux-x86_64-fedora-gcc
Version: 0.7.0
Check: tests
Result: ERROR
Running ‘testthat.R’ [14s/21s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> library(testthat)
> library(mcglm)
----------------------------------------------------------------------
mcglm: Multivariate Covariance Generalized Linear Models
For support, collaboration or bug report, visit:
http://mcglm.leg.ufpr.br/
mcglm version 0.7.0 (build on 2021-07-07) is now loaded.
----------------------------------------------------------------------
>
> test_check("mcglm")
[1] "Running test_mc_build_C.R"
[1] "Testing covariance identity"
[1] "OK"
[1] "Testing covariance inverse"
[1] "OK"
[1] "Testing covariance expm"
[1] "OK"
[1] "Checking computations"
[1] "Testing variance function: tweedie"
[1] "OK"
[1] "Testing variance function: binomialP"
[1] "OK"
[1] "Checking Poisson-Tweedie derivatives"
[1] "Checking binomiaPQ derivatives"
[1] "test_mc_build.C - OK"
[1] "test_mc_build_omega.R"
[1] "test_mc_build_omega.R - OK"
[1] "test_mc_build_sigma.R"
[1] "test_mc_build_sigma.R - OK"
[1] "test_mc_build_sigma_between.R"
[1] "test_mc_build_sigma_between.R-OK"
[1] "Testing link functions ..."
[1] "Testing link functions - Part II"
[1] "Testing link functions - Part II"
[1] "Testing Matrix linear predictor..."
[1] "Testing Matrix linear predictor... OK"
[1] "Testing variance function ..."
[1] "Testing variance function ... OK"
[ FAIL 1 | WARN 1 | SKIP 0 | PASS 370 ]
══ Failed tests ════════════════════════════════════════════════════════════════
── Error (test_mc_quasi_score.R:29:1): (code run outside of `test_that()`) ─────
Error in `(function (classes, fdef, mtable)
{
methods <- .findInheritedMethods(classes, fdef, mtable)
if (length(methods) == 1L)
return(methods[[1L]])
else if (length(methods) == 0L) {
cnames <- paste0("\"", vapply(classes, as.character,
""), "\"", collapse = ", ")
stop(gettextf("unable to find an inherited method for function %s for signature %s",
sQuote(fdef@generic), sQuote(cnames)), domain = NA)
}
else stop("Internal error in finding inherited methods; didn't return a unique method",
domain = NA)
})(list(structure("dgCMatrix", package = "Matrix"), "logical"),
new("standardGeneric", .Data = function (x, uplo)
standardGeneric("forceSymmetric"), generic = structure("forceSymmetric", package = "Matrix"),
package = "Matrix", group = list(), valueClass = character(0),
signature = c("x", "uplo"), default = NULL, skeleton = (function (x,
uplo)
stop(gettextf("invalid call in method dispatch to '%s' (no default method)",
"forceSymmetric"), domain = NA))(x, uplo)), <environment>)`: unable to find an inherited method for function 'forceSymmetric' for signature '"dgCMatrix", "logical"'
Backtrace:
▆
1. └─mcglm:::mc_pearson(...) at test_mc_quasi_score.R:29:0
2. └─mcglm:::mc_sensitivity(product, W = W)
3. └─Matrix::forceSymmetric(Sensitivity, uplo = FALSE)
4. └─methods (local) `<fn>`(`<list>`, `<stndrdGn>`, `<env>`)
[ FAIL 1 | WARN 1 | SKIP 0 | PASS 370 ]
Error: Test failures
Execution halted
Flavor: r-devel-linux-x86_64-fedora-gcc
Version: 0.7.0
Check: re-building of vignette outputs
Result: ERROR
Error(s) in re-building vignettes:
--- re-building ‘GLMExamples.Rmd’ using rmarkdown
Loading required package: mcglm
----------------------------------------------------------------------
mcglm: Multivariate Covariance Generalized Linear Models
For support, collaboration or bug report, visit:
http://mcglm.leg.ufpr.br/
mcglm version 0.7.0 (build on 2021-07-07) is now loaded.
----------------------------------------------------------------------
Loading required package: Matrix
Quitting from lines 67-77 (GLMExamples.Rmd)
Error: processing vignette 'GLMExamples.Rmd' failed with diagnostics:
$ operator is invalid for atomic vectors
--- failed re-building ‘GLMExamples.Rmd’
--- re-building ‘UniModels.Rmd’ using rmarkdown
Loading required package: mvtnorm
Loading required package: tweedie
Quitting from lines 52-80 (UniModels.Rmd)
Error: processing vignette 'UniModels.Rmd' failed with diagnostics:
$ operator is invalid for atomic vectors
--- failed re-building ‘UniModels.Rmd’
SUMMARY: processing the following files failed:
‘GLMExamples.Rmd’ ‘UniModels.Rmd’
Error: Vignette re-building failed.
Execution halted
Flavor: r-devel-linux-x86_64-fedora-gcc
Version: 0.7.0
Check: installed package size
Result: NOTE
installed size is 5.4Mb
sub-directories of 1Mb or more:
doc 1.5Mb
libs 3.4Mb
Flavor: r-oldrel-macos-arm64