raulcd opened a new issue, #48805:
URL: https://github.com/apache/arrow/issues/48805

   ### Describe the bug, including details regarding any error messages, 
version, and platform.
   
   The 
[test-r-alpine-linux-cran](https://github.com/ursacomputing/crossbow/actions/runs/20837093081/job/59863891453)
 has been failing for the last weeks. It seems to have started when these 
commits were merged: 
https://github.com/apache/arrow/compare/eb73bc649138005299b4d0e1230f251bc752e22e...713c57a77cacc6df7f607311943fae4f2cb29efe
   
   The failure:
   ```r
   > library(tibble)
   > 
   > verbose_test_output <- identical(tolower(Sys.getenv("ARROW_R_DEV", 
"false")), "true") ||
   +   identical(tolower(Sys.getenv("ARROW_R_VERBOSE_TEST", "false")), "true")
   > 
   > if (verbose_test_output) {
   +   arrow_reporter <- MultiReporter$new(list(CheckReporter$new(), 
LocationReporter$new()))
   + } else {
   +   arrow_reporter <- check_reporter()
   + }
   > test_check("arrow", reporter = arrow_reporter)
   Start test: Integer Array
     'test-Array.R:25:3' [success]
     'test-Array.R:25:3' [success]
   
    *** caught segfault ***
   address 0, cause 'unknown'
   
   Traceback:
    1: compute__CallFunction(function_name, args, options)
    2: call_function("is_null", x, options = list(nan_is_null = TRUE))
    3: is.na.ArrowDatum(a)
    4: is.na(a)
    5: as.vector(x)
    6: inherits(object, "ArrowObject")
    7: expect_equal(as.vector(x), y, ...)
    8: expect_as_vector(is.na(a), is.na(x))
    9: expect_array_roundtrip(ints, int32())
   10: eval(code, test_env)
   11: eval(code, test_env)
   12: withCallingHandlers({    eval(code, test_env)    new_expectations <- 
the$test_expectations > starting_expectations    if (snapshot_skipped) {        
skip("On CRAN")    }    else if (!new_expectations && skip_on_empty) {        
skip_empty()    }}, expectation = handle_expectation, packageNotFoundError = 
function(e) {    if (on_cran()) {        skip(paste0("{", e$package, "} is not 
installed."))    }}, snapshot_on_cran = function(cnd) {    snapshot_skipped <<- 
TRUE    invokeRestart("muffle_cran_snapshot")}, skip = handle_skip, warning = 
handle_warning, message = handle_message,     error = handle_error, interrupt = 
handle_interrupt)
   13: doTryCatch(return(expr), name, parentenv, handler)
   14: tryCatchOne(expr, names, parentenv, handlers[[1L]])
   15: tryCatchList(expr, classes, parentenv, handlers)
   16: tryCatch(withCallingHandlers({    eval(code, test_env)    
new_expectations <- the$test_expectations > starting_expectations    if 
(snapshot_skipped) {        skip("On CRAN")    }    else if (!new_expectations 
&& skip_on_empty) {        skip_empty()    }}, expectation = 
handle_expectation, packageNotFoundError = function(e) {    if (on_cran()) {    
    skip(paste0("{", e$package, "} is not installed."))    }}, snapshot_on_cran 
= function(cnd) {    snapshot_skipped <<- TRUE    
invokeRestart("muffle_cran_snapshot")}, skip = handle_skip, warning = 
handle_warning, message = handle_message,     error = handle_error, interrupt = 
handle_interrupt), error = handle_fatal)
   17: doWithOneRestart(return(expr), restart)
   18: withOneRestart(expr, restarts[[1L]])
   19: withRestarts(tryCatch(withCallingHandlers({    eval(code, test_env)    
new_expectations <- the$test_expectations > starting_expectations    if 
(snapshot_skipped) {        skip("On CRAN")    }    else if (!new_expectations 
&& skip_on_empty) {        skip_empty()    }}, expectation = 
handle_expectation, packageNotFoundError = function(e) {    if (on_cran()) {    
    skip(paste0("{", e$package, "} is not installed."))    }}, snapshot_on_cran 
= function(cnd) {    snapshot_skipped <<- TRUE    
invokeRestart("muffle_cran_snapshot")}, skip = handle_skip, warning = 
handle_warning, message = handle_message,     error = handle_error, interrupt = 
handle_interrupt), error = handle_fatal),     end_test = function() {    })
   20: test_code(code, parent.frame())
   21: test_that("Integer Array", {    ints <- c(1:10, 1:10, 1:5)    x <- 
expect_array_roundtrip(ints, int32())})
   22: eval(code, test_env)
   23: eval(code, test_env)
   24: withCallingHandlers({    eval(code, test_env)    new_expectations <- 
the$test_expectations > starting_expectations    if (snapshot_skipped) {        
skip("On CRAN")    }    else if (!new_expectations && skip_on_empty) {        
skip_empty()    }}, expectation = handle_expectation, packageNotFoundError = 
function(e) {    if (on_cran()) {        skip(paste0("{", e$package, "} is not 
installed."))    }}, snapshot_on_cran = function(cnd) {    snapshot_skipped <<- 
TRUE    invokeRestart("muffle_cran_snapshot")}, skip = handle_skip, warning = 
handle_warning, message = handle_message,     error = handle_error, interrupt = 
handle_interrupt)
   25: doTryCatch(return(expr), name, parentenv, handler)
   26: tryCatchOne(expr, names, parentenv, handlers[[1L]])
   27: tryCatchList(expr, classes, parentenv, handlers)
   28: tryCatch(withCallingHandlers({    eval(code, test_env)    
new_expectations <- the$test_expectations > starting_expectations    if 
(snapshot_skipped) {        skip("On CRAN")    }    else if (!new_expectations 
&& skip_on_empty) {        skip_empty()    }}, expectation = 
handle_expectation, packageNotFoundError = function(e) {    if (on_cran()) {    
    skip(paste0("{", e$package, "} is not installed."))    }}, snapshot_on_cran 
= function(cnd) {    snapshot_skipped <<- TRUE    
invokeRestart("muffle_cran_snapshot")}, skip = handle_skip, warning = 
handle_warning, message = handle_message,     error = handle_error, interrupt = 
handle_interrupt), error = handle_fatal)
   29: doWithOneRestart(return(expr), restart)
   30: withOneRestart(expr, restarts[[1L]])
   31: withRestarts(tryCatch(withCallingHandlers({    eval(code, test_env)    
new_expectations <- the$test_expectations > starting_expectations    if 
(snapshot_skipped) {        skip("On CRAN")    }    else if (!new_expectations 
&& skip_on_empty) {        skip_empty()    }}, expectation = 
handle_expectation, packageNotFoundError = function(e) {    if (on_cran()) {    
    skip(paste0("{", e$package, "} is not installed."))    }}, snapshot_on_cran 
= function(cnd) {    snapshot_skipped <<- TRUE    
invokeRestart("muffle_cran_snapshot")}, skip = handle_skip, warning = 
handle_warning, message = handle_message,     error = handle_error, interrupt = 
handle_interrupt), error = handle_fatal),     end_test = function() {    })
   32: test_code(code = exprs, env = env, reporter = get_reporter() %||%     
StopReporter$new())
   33: source_file(path, env = env(env), desc = desc, shuffle = shuffle,     
error_call = error_call)
   34: FUN(X[[i]], ...)
   35: lapply(test_paths, test_one_file, env = env, desc = desc, shuffle = 
shuffle,     error_call = error_call)
   36: doTryCatch(return(expr), name, parentenv, handler)
   37: tryCatchOne(expr, names, parentenv, handlers[[1L]])
   38: tryCatchList(expr, classes, parentenv, handlers)
   39: tryCatch(code, testthat_abort_reporter = function(cnd) {    
cat(conditionMessage(cnd), "\n")    NULL})
   40: with_reporter(reporters$multi, lapply(test_paths, test_one_file,     env 
= env, desc = desc, shuffle = shuffle, error_call = error_call))
   41: test_files_serial(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,     desc = desc, load_package = load_package, shuffle = 
shuffle,     error_call = error_call)
   42: 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,     
load_package = load_package, parallel = parallel, shuffle = shuffle)
   43: test_dir("testthat", package = package, reporter = reporter,     ..., 
load_package = "installed")
   44: test_check("arrow", reporter = arrow_reporter)
   An irrecoverable exception occurred. R is aborting now ...
   Segmentation fault (core dumped)
   
   Error: R CMD check found ERRORs
   Execution halted
   2 errors ✖ | 5 warnings ✖ | 4 notes ✖
   ```
   
   ### Component(s)
   
   Continuous Integration, R


-- 
This is an automated message from the Apache Git Service.
To respond to the message, please log on to GitHub and use the
URL above to go to the specific comment.

To unsubscribe, e-mail: [email protected]

For queries about this service, please contact Infrastructure at:
[email protected]

Reply via email to