CRAN Package Check Results for Package cecs

Last updated on 2021-02-01 05:47:31 CET.

Flavor Version Tinstall Tcheck Ttotal Status Flags
r-devel-linux-x86_64-debian-clang 0.1.0 17.63 21.40 39.03 ERROR
r-devel-linux-x86_64-debian-gcc 0.1.0 6.39 17.05 23.44 ERROR
r-devel-linux-x86_64-fedora-clang 0.1.0 72.70 WARN
r-devel-linux-x86_64-fedora-gcc 0.1.0 50.90 NOTE
r-devel-windows-ix86+x86_64 0.1.0 29.00 88.00 117.00 OK
r-patched-linux-x86_64 0.1.0 7.95 21.05 29.00 ERROR
r-patched-solaris-x86 0.1.0 85.40 OK
r-release-linux-x86_64 0.1.0 8.16 21.00 29.16 ERROR
r-release-macos-x86_64 0.1.0 ERROR
r-release-windows-ix86+x86_64 0.1.0 28.00 88.00 116.00 OK
r-oldrel-macos-x86_64 0.1.0 ERROR
r-oldrel-windows-ix86+x86_64 0.1.0 25.00 92.00 117.00 OK

Additional issues

M1mac valgrind

Check Details

Version: 0.1.0
Check: whether package can be installed
Result: WARN
    Found the following significant warnings:
     cec2017_functions.c:40:24: warning: using integer absolute value function 'abs' when argument is of floating point type [-Wabsolute-value]
     cecs.c:15:16: warning: logical not is only applied to the left hand side of this comparison [-Wlogical-not-parentheses]
Flavors: r-devel-linux-x86_64-debian-clang, r-devel-linux-x86_64-fedora-clang

Version: 0.1.0
Check: tests
Result: ERROR
     Running 'testthat.R' [1s/1s]
    Running the tests in 'tests/testthat.R' failed.
    Complete output:
     > library(testthat)
     > library(cecs)
     >
     > test_check("cecs")
     Cannot open input file for reading: No such file or directory
    
     *** caught segfault ***
     address 0xc0, cause 'memory not mapped'
    
     Traceback:
     1: cec(func_index, x, cec = "cec2013", max_func_index = 28, dims = c(2, 5, 10, 20, 30, 40, 50, 60, 70, 80, 90, 100), suite = NULL)
     2: cec2013(func, rnorm(dim))
     3: eval_bare(expr, quo_get_env(quo))
     4: quasi_label(enquo(object), arg = "object")
     5: expect_type(cec2013(func, rnorm(dim)), "double")
     6: .f(func = .l[[1L]][[i]], dim = .l[[2L]][[i]], ...)
     7: purrr::pmap(problem_dim_grid, function(func, dim) { expect_type(cec2013(func, rnorm(dim)), "double")})
     8: eval(code, test_env)
     9: eval(code, test_env)
     10: withCallingHandlers({ eval(code, test_env) if (!handled && !is.null(test)) { skip_empty() }}, expectation = handle_expectation, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error)
     11: doTryCatch(return(expr), name, parentenv, handler)
     12: tryCatchOne(expr, names, parentenv, handlers[[1L]])
     13: tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     14: doTryCatch(return(expr), name, parentenv, handler)
     15: tryCatchOne(tryCatchList(expr, names[-nh], parentenv, handlers[-nh]), names[nh], parentenv, handlers[[nh]])
     16: tryCatchList(expr, classes, parentenv, handlers)
     17: tryCatch(withCallingHandlers({ eval(code, test_env) if (!handled && !is.null(test)) { skip_empty() }}, expectation = handle_expectation, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error), error = handle_fatal, skip = function(e) { })
     18: test_code(desc, code, env = parent.frame(), reporter = reporter)
     19: test_that("all benchmark functions from CEC-2013 can be executed", { problem_dim_grid <- expand.grid(func = 1:28, dim = c(2, 5, 10, 20, 30, 40, 50, 60, 70, 80, 90, 100)) purrr::pmap(problem_dim_grid, function(func, dim) { expect_type(cec2013(func, rnorm(dim)), "double") }) })
     20: eval(code, test_env)
     21: eval(code, test_env)
     22: withCallingHandlers({ eval(code, test_env) if (!handled && !is.null(test)) { skip_empty() }}, expectation = handle_expectation, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error)
     23: doTryCatch(return(expr), name, parentenv, handler)
     24: tryCatchOne(expr, names, parentenv, handlers[[1L]])
     25: tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     26: doTryCatch(return(expr), name, parentenv, handler)
     27: tryCatchOne(tryCatchList(expr, names[-nh], parentenv, handlers[-nh]), names[nh], parentenv, handlers[[nh]])
     28: tryCatchList(expr, classes, parentenv, handlers)
     29: tryCatch(withCallingHandlers({ eval(code, test_env) if (!handled && !is.null(test)) { skip_empty() }}, expectation = handle_expectation, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error), error = handle_fatal, skip = function(e) { })
     30: test_code(NULL, exprs, env)
     31: source_file(path, child_env(env), wrap = wrap)
     32: FUN(X[[i]], ...)
     33: lapply(test_paths, test_one_file, env = env, wrap = wrap)
     34: force(code)
     35: doWithOneRestart(return(expr), restart)
     36: withOneRestart(expr, restarts[[1L]])
     37: withRestarts(testthat_abort_reporter = function() NULL, force(code))
     38: with_reporter(reporters$multi, lapply(test_paths, test_one_file, env = env, wrap = wrap))
     39: test_files(test_dir = test_dir, test_package = test_package, test_paths = test_paths, load_helpers = load_helpers, reporter = reporter, env = env, stop_on_failure = stop_on_failure, stop_on_warning = stop_on_warning, wrap = wrap, load_package = load_package)
     40: test_files(test_dir = path, test_paths = test_paths, test_package = package, reporter = reporter, load_helpers = load_helpers, env = env, stop_on_failure = stop_on_failure, stop_on_warning = stop_on_warning, wrap = wrap, load_package = load_package, parallel = parallel)
     41: test_dir("testthat", package = package, reporter = reporter, ..., load_package = "installed")
     42: test_check("cecs")
     An irrecoverable exception occurred. R is aborting now ...
     Segmentation fault
Flavors: r-devel-linux-x86_64-debian-clang, r-patched-linux-x86_64, r-release-linux-x86_64

Version: 0.1.0
Check: tests
Result: ERROR
     Running ‘testthat.R’ [1s/2s]
    Running the tests in ‘tests/testthat.R’ failed.
    Complete output:
     > library(testthat)
     > library(cecs)
     >
     > test_check("cecs")
     Cannot open input file for reading: No such file or directory
    
     *** caught segfault ***
     address 0xc0, cause 'memory not mapped'
    
     Traceback:
     1: cec(func_index, x, cec = "cec2013", max_func_index = 28, dims = c(2, 5, 10, 20, 30, 40, 50, 60, 70, 80, 90, 100), suite = NULL)
     2: cec2013(func, rnorm(dim))
     3: eval_bare(expr, quo_get_env(quo))
     4: quasi_label(enquo(object), arg = "object")
     5: expect_type(cec2013(func, rnorm(dim)), "double")
     6: .f(func = .l[[1L]][[i]], dim = .l[[2L]][[i]], ...)
     7: purrr::pmap(problem_dim_grid, function(func, dim) { expect_type(cec2013(func, rnorm(dim)), "double")})
     8: eval(code, test_env)
     9: eval(code, test_env)
     10: withCallingHandlers({ eval(code, test_env) if (!handled && !is.null(test)) { skip_empty() }}, expectation = handle_expectation, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error)
     11: doTryCatch(return(expr), name, parentenv, handler)
     12: tryCatchOne(expr, names, parentenv, handlers[[1L]])
     13: tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     14: doTryCatch(return(expr), name, parentenv, handler)
     15: tryCatchOne(tryCatchList(expr, names[-nh], parentenv, handlers[-nh]), names[nh], parentenv, handlers[[nh]])
     16: tryCatchList(expr, classes, parentenv, handlers)
     17: tryCatch(withCallingHandlers({ eval(code, test_env) if (!handled && !is.null(test)) { skip_empty() }}, expectation = handle_expectation, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error), error = handle_fatal, skip = function(e) { })
     18: test_code(desc, code, env = parent.frame(), reporter = reporter)
     19: test_that("all benchmark functions from CEC-2013 can be executed", { problem_dim_grid <- expand.grid(func = 1:28, dim = c(2, 5, 10, 20, 30, 40, 50, 60, 70, 80, 90, 100)) purrr::pmap(problem_dim_grid, function(func, dim) { expect_type(cec2013(func, rnorm(dim)), "double") }) })
     20: eval(code, test_env)
     21: eval(code, test_env)
     22: withCallingHandlers({ eval(code, test_env) if (!handled && !is.null(test)) { skip_empty() }}, expectation = handle_expectation, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error)
     23: doTryCatch(return(expr), name, parentenv, handler)
     24: tryCatchOne(expr, names, parentenv, handlers[[1L]])
     25: tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     26: doTryCatch(return(expr), name, parentenv, handler)
     27: tryCatchOne(tryCatchList(expr, names[-nh], parentenv, handlers[-nh]), names[nh], parentenv, handlers[[nh]])
     28: tryCatchList(expr, classes, parentenv, handlers)
     29: tryCatch(withCallingHandlers({ eval(code, test_env) if (!handled && !is.null(test)) { skip_empty() }}, expectation = handle_expectation, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error), error = handle_fatal, skip = function(e) { })
     30: test_code(NULL, exprs, env)
     31: source_file(path, child_env(env), wrap = wrap)
     32: FUN(X[[i]], ...)
     33: lapply(test_paths, test_one_file, env = env, wrap = wrap)
     34: force(code)
     35: doWithOneRestart(return(expr), restart)
     36: withOneRestart(expr, restarts[[1L]])
     37: withRestarts(testthat_abort_reporter = function() NULL, force(code))
     38: with_reporter(reporters$multi, lapply(test_paths, test_one_file, env = env, wrap = wrap))
     39: test_files(test_dir = test_dir, test_package = test_package, test_paths = test_paths, load_helpers = load_helpers, reporter = reporter, env = env, stop_on_failure = stop_on_failure, stop_on_warning = stop_on_warning, wrap = wrap, load_package = load_package)
     40: test_files(test_dir = path, test_paths = test_paths, test_package = package, reporter = reporter, load_helpers = load_helpers, env = env, stop_on_failure = stop_on_failure, stop_on_warning = stop_on_warning, wrap = wrap, load_package = load_package, parallel = parallel)
     41: test_dir("testthat", package = package, reporter = reporter, ..., load_package = "installed")
     42: test_check("cecs")
     An irrecoverable exception occurred. R is aborting now ...
     Segmentation fault
Flavor: r-devel-linux-x86_64-debian-gcc

Version: 0.1.0
Check: compiled code
Result: NOTE
    File ‘cecs/libs/cecs.so’:
     Found no calls to: ‘R_registerRoutines’, ‘R_useDynamicSymbols’
    
    It is good practice to register native routines and to disable symbol
    search.
    
    See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual.
Flavors: r-devel-linux-x86_64-fedora-clang, r-devel-linux-x86_64-fedora-gcc

Version: 0.1.0
Check: whether package can be installed
Result: ERROR
    Installation failed.
Flavors: r-release-macos-x86_64, r-oldrel-macos-x86_64