You are viewing a plain text version of this content. The canonical link for it is here.
Posted to jira@arrow.apache.org by "David Li (Jira)" <ji...@apache.org> on 2021/11/23 21:35:00 UTC

[jira] [Closed] (ARROW-14707) [C++][R] r-autobrew nightly failing with 'caught illegal operation'

     [ https://issues.apache.org/jira/browse/ARROW-14707?page=com.atlassian.jira.plugin.system.issuetabpanels:all-tabpanel ]

David Li closed ARROW-14707.
----------------------------
    Resolution: Duplicate

> [C++][R] r-autobrew nightly failing with 'caught illegal operation'
> -------------------------------------------------------------------
>
>                 Key: ARROW-14707
>                 URL: https://issues.apache.org/jira/browse/ARROW-14707
>             Project: Apache Arrow
>          Issue Type: Bug
>          Components: C++, R
>            Reporter: David Li
>            Priority: Major
>
> [Full log|https://github.com/ursacomputing/crossbow/runs/4197210588?check_suite_focus=true]:
> {noformat}
> > library(tibble)
> > 
> > if (identical(tolower(Sys.getenv("ARROW_R_DEV", "false")), "true")) {
> +   arrow_reporter <- MultiReporter$new(list(CheckReporter$new(), LocationReporter$new()))
> + } else {
> +   arrow_reporter <- check_reporter()
> + }
> > test_check("arrow", reporter = arrow_reporter)
>  *** caught illegal operation ***
> address 0x10f68cc40, cause 'illegal opcode'
> Traceback:
>  1: compute__CallFunction(function_name, args, options)
>  2: call_function("filter", self, i, options = list(keep_na = keep_na))
>  3: x$Filter(i, keep_na)
>  4: `[.ArrowDatum`(a, rep(c(TRUE, FALSE), 5))
>  5: a[rep(c(TRUE, FALSE), 5)]
>  6: as.vector(x)
>  7: inherits(object, "ArrowObject")
>  8: expect_equal(as.vector(x), y, ...)
>  9: expect_as_vector(a[rep(c(TRUE, FALSE), 5)], vec[c(1, 3, 5, 7,     9)])
> 10: eval(code, test_env)
> 11: eval(code, test_env)
> 12: 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)
> 13: doTryCatch(return(expr), name, parentenv, handler)
> 14: tryCatchOne(expr, names, parentenv, handlers[[1L]])
> 15: tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
> 16: doTryCatch(return(expr), name, parentenv, handler)
> 17: tryCatchOne(tryCatchList(expr, names[-nh], parentenv, handlers[-nh]),     names[nh], parentenv, handlers[[nh]])
> 18: tryCatchList(expr, classes, parentenv, handlers)
> 19: 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) {    })
> 20: test_code(desc, code, env = parent.frame(), reporter = reporter)
> 21: testthat::test_that(what, {    skip_if(getOption("..skip.tests", TRUE), "arrow C++ library not available")    code})
> 22: test_that("[ method on Array", {    vec <- 11:20    a <- Array$create(vec)    expect_as_vector(a[5:9], vec[5:9])    expect_as_vector(a[c(9, 3, 5)], vec[c(9, 3, 5)])    expect_as_vector(a[rep(c(TRUE, FALSE), 5)], vec[c(1, 3, 5,         7, 9)])    expect_as_vector(a[rep(c(TRUE, FALSE, NA, FALSE, TRUE), 2)],         c(11, NA, 15, 16, NA, 20))    expect_as_vector(a[-4], vec[-4])    expect_as_vector(a[-1], vec[-1])})
> 23: eval(code, test_env)
> 24: eval(code, test_env)
> 25: 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)
> 26: doTryCatch(return(expr), name, parentenv, handler)
> 27: tryCatchOne(expr, names, parentenv, handlers[[1L]])
> 28: tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
> 29: doTryCatch(return(expr), name, parentenv, handler)
> 30: tryCatchOne(tryCatchList(expr, names[-nh], parentenv, handlers[-nh]),     names[nh], parentenv, handlers[[nh]])
> 31: tryCatchList(expr, classes, parentenv, handlers)
> 32: 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) {    })
> 33: test_code(NULL, exprs, env)
> 34: source_file(path, child_env(env), wrap = wrap)
> 35: FUN(X[[i]], ...)
> 36: lapply(test_paths, test_one_file, env = env, wrap = wrap)
> 37: doTryCatch(return(expr), name, parentenv, handler)
> 38: tryCatchOne(expr, names, parentenv, handlers[[1L]])
> 39: tryCatchList(expr, classes, parentenv, handlers)
> 40: tryCatch(code, testthat_abort_reporter = function(cnd) {    cat(conditionMessage(cnd), "\n")    NULL})
> 41: with_reporter(reporters$multi, lapply(test_paths, test_one_file,     env = env, wrap = wrap))
> 42: 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)
> 43: 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)
> 44: test_dir("testthat", package = package, reporter = reporter,     ..., load_package = "installed")
> 45: test_check("arrow", reporter = arrow_reporter)
> An irrecoverable exception occurred. R is aborting now ...
> {noformat}



--
This message was sent by Atlassian Jira
(v8.20.1#820001)