CRAN Package Check Results for Package ldat

Last updated on 2020-08-07 01:49:50 CEST.

Flavor Version Tinstall Tcheck Ttotal Status Flags
r-devel-linux-x86_64-debian-clang 0.3.3 51.74 35.48 87.22 OK
r-devel-linux-x86_64-debian-gcc 0.3.3 37.76 27.58 65.34 OK
r-devel-linux-x86_64-fedora-clang 0.3.3 129.59 OK
r-devel-linux-x86_64-fedora-gcc 0.3.3 108.78 OK
r-devel-windows-ix86+x86_64 0.3.3 160.00 109.00 269.00 OK
r-patched-linux-x86_64 0.3.3 37.47 35.25 72.72 OK
r-patched-solaris-x86 0.3.3 107.40 ERROR
r-release-linux-x86_64 0.3.3 38.50 34.96 73.46 OK
r-release-macos-x86_64 0.3.3 OK
r-release-windows-ix86+x86_64 0.3.3 158.00 144.00 302.00 OK
r-oldrel-macos-x86_64 0.3.3 OK
r-oldrel-windows-ix86+x86_64 0.3.3 105.00 129.00 234.00 OK

Check Details

Version: 0.3.3
Check: tests
Result: ERROR
     Running ‘tests.R’ [4s/18s]
    Running the tests in ‘tests/tests.R’ failed.
    Complete output:
     > library(ldat)
     Loading required package: lvec
    
     Attaching package: 'lvec'
    
     The following object is masked from 'package:base':
    
     order
    
     Loading required package: Rcpp
    
     Attaching package: 'ldat'
    
     The following objects are masked from 'package:base':
    
     append, match, table, which
    
     > library(testthat)
     >
     > test_check("ldat")
    
     *** caught bus error ***
     address f7ca0000, cause 'object specific hardware error'
    
     Traceback:
     1: as_lvec(values)
     2: lset.lvec(X[[i]], ...)
     3: FUN(X[[i]], ...)
     4: lapply(x, lset, index = index, range = range, values = values)
     5: lset.ldat(x, index = 1:2, 11:12)
     6: lset(x, index = 1:2, 11:12)
     7: eval(code, test_env)
     8: eval(code, test_env)
     9: 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)
     10: doTryCatch(return(expr), name, parentenv, handler)
     11: tryCatchOne(expr, names, parentenv, handlers[[1L]])
     12: tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     13: doTryCatch(return(expr), name, parentenv, handler)
     14: tryCatchOne(tryCatchList(expr, names[-nh], parentenv, handlers[-nh]), names[nh], parentenv, handlers[[nh]])
     15: tryCatchList(expr, classes, parentenv, handlers)
     16: 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) { })
     17: test_code(desc, code, env = parent.frame())
     18: test_that("lset.dat works", { x_r <- data.frame(x = 1:20, y = letters[1:20], stringsAsFactors = FALSE) x <- as_ldat(x_r) lset(x, index = 1:2, data.frame(x = 11:12, y = c("q", "r"), stringsAsFactors = FALSE)) x_r[1:2, ] <- data.frame(x = 11:12, y = c("q", "r"), stringsAsFactors = FALSE) expect_equivalent(as.data.frame(x), x_r) lset(x, range = 1:2, values = data.frame(x = 11:12, y = c("q", "r"), stringsAsFactors = FALSE)) x_r[1:2, ] <- data.frame(x = 11:12, y = c("q", "r"), stringsAsFactors = FALSE) expect_equivalent(as.data.frame(x), x_r) x_r <- data.frame(x = 1:20, y = 1:20, stringsAsFactors = FALSE) x <- as_ldat(x_r) lset(x, index = 1:2, 11:12) x_r[1:2, ] <- 11:12 expect_equivalent(as.data.frame(x), x_r) lset(x, range = 1:2, values = 11:12) x_r[1:2, ] <- 11:12 expect_equivalent(as.data.frame(x), x_r)})
     19: eval(code, test_env)
     20: eval(code, test_env)
     21: 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)
     22: doTryCatch(return(expr), name, parentenv, handler)
     23: tryCatchOne(expr, names, parentenv, handlers[[1L]])
     24: tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
     25: doTryCatch(return(expr), name, parentenv, handler)
     26: tryCatchOne(tryCatchList(expr, names[-nh], parentenv, handlers[-nh]), names[nh], parentenv, handlers[[nh]])
     27: tryCatchList(expr, classes, parentenv, handlers)
     28: 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) { })
     29: test_code(NULL, exprs, env)
     30: source_file(path, new.env(parent = env), chdir = TRUE, wrap = wrap)
     31: force(code)
     32: doWithOneRestart(return(expr), restart)
     33: withOneRestart(expr, restarts[[1L]])
     34: withRestarts(testthat_abort_reporter = function() NULL, force(code))
     35: with_reporter(reporter = reporter, start_end_reporter = start_end_reporter, { reporter$start_file(basename(path)) lister$start_file(basename(path)) source_file(path, new.env(parent = env), chdir = TRUE, wrap = wrap) reporter$.end_context() reporter$end_file() })
     36: FUN(X[[i]], ...)
     37: lapply(paths, test_file, env = env, reporter = current_reporter, start_end_reporter = FALSE, load_helpers = FALSE, wrap = wrap)
     38: force(code)
     39: doWithOneRestart(return(expr), restart)
     40: withOneRestart(expr, restarts[[1L]])
     41: withRestarts(testthat_abort_reporter = function() NULL, force(code))
     42: with_reporter(reporter = current_reporter, results <- lapply(paths, test_file, env = env, reporter = current_reporter, start_end_reporter = FALSE, load_helpers = FALSE, wrap = wrap))
     43: test_files(paths, reporter = reporter, env = env, stop_on_failure = stop_on_failure, stop_on_warning = stop_on_warning, wrap = wrap)
     44: test_dir(path = test_path, reporter = reporter, env = env, filter = filter, ..., stop_on_failure = stop_on_failure, stop_on_warning = stop_on_warning, wrap = wrap)
     45: test_package_dir(package = package, test_path = test_path, filter = filter, reporter = reporter, ..., stop_on_failure = stop_on_failure, stop_on_warning = stop_on_warning, wrap = wrap)
     46: test_check("ldat")
     An irrecoverable exception occurred. R is aborting now ...
Flavor: r-patched-solaris-x86